闪亮的仪表盘,用户身份验证身份验证、仪表盘、用户

2023-09-03 14:03:10 作者:旧心酸

我正在尝试在我找到的代码片段(https://github.com/treysp/shiny_password)中包含一个闪亮的仪表板,该代码片段将一个闪亮的应用程序包装在用于设置用户身份验证的函数中。

这段代码可以很好地与fluidPage()一起使用,但我注意到,当我包装dhasboardPage()时,它不起作用:我尝试登录,输入我的用户名和密码,单击登录,然后什么也没有发生,我被困在登录页面上。我用来通过调用runApp()启动服务器的控制台中没有错误消息

智能家居应用程序的制作

您知道可能导致此特定问题的原因吗?

提前谢谢

推荐答案

以下是一个可供您开始使用的工作示例。这是一个非常基本的实现。

在测试用例中,存储的密码是可见的。您不希望以这种方式进行身份验证。这是不安全的。您需要找到一种方法来散列密码并进行匹配。关于惠东田有一些线索github link

我实现了server.r中的大部分ui.r代码。不确定是否有解决办法。我注意到的缺点是代码行太多。这将是很好的打破每个侧选项卡到一个单独的文件。我自己还没试过呢。然而,这里是@Dean Attali出色闪亮资源split code

ui.r

require(shiny)
require(shinydashboard)

header <- dashboardHeader(title = "my heading")
sidebar <- dashboardSidebar(uiOutput("sidebarpanel"))
body <- dashboardBody(uiOutput("body"))
ui <- dashboardPage(header, sidebar, body)

服务器。r

login_details <- data.frame(user = c("sam", "pam", "ron"),
                            pswd = c("123", "123", "123"))
login <- box(
  title = "Login",
  textInput("userName", "Username"),
  passwordInput("passwd", "Password"),
  br(),
  actionButton("Login", "Log in")
)

server <- function(input, output, session) {
  # To logout back to login page
  login.page = paste(
    isolate(session$clientData$url_protocol),
    "//",
    isolate(session$clientData$url_hostname),
    ":",
    isolate(session$clientData$url_port),
    sep = ""
  )
  histdata <- rnorm(500)
  USER <- reactiveValues(Logged = F)
  observe({
    if (USER$Logged == FALSE) {
      if (!is.null(input$Login)) {
        if (input$Login > 0) {
          Username <- isolate(input$userName)
          Password <- isolate(input$passwd)
          Id.username <- which(login_details$user %in% Username)
          Id.password <- which(login_details$pswd %in% Password)
          if (length(Id.username) > 0 & length(Id.password) > 0){
            if (Id.username == Id.password) {
              USER$Logged <- TRUE
            }
          }
        }
      }
    }
  })
  output$sidebarpanel <- renderUI({
    if (USER$Logged == TRUE) {
      div(
        sidebarUserPanel(
          isolate(input$userName),
          subtitle = a(icon("usr"), "Logout", href = login.page)
        ),
        selectInput(
          "in_var",
          "myvar",
          multiple = FALSE,
          choices = c("option 1", "option 2")
        ),
        sidebarMenu(
          menuItem(
            "Item 1",
            tabName = "t_item1",
            icon = icon("line-chart")
          ),
          menuItem("Item 2",
                   tabName = "t_item2",
                   icon = icon("dollar"))
        )
      )
    }
  })

  output$body <- renderUI({
    if (USER$Logged == TRUE) {
      tabItems(
        # First tab content
        tabItem(tabName = "t_item1",
                fluidRow(
                  output$plot1 <- renderPlot({
                    data <- histdata[seq_len(input$slider)]
                    hist(data)
                  }, height = 300, width = 300) ,
                  box(
                    title = "Controls",
                    sliderInput("slider", "observations:", 1, 100, 50)
                  )
                )),

        # Second tab content
        tabItem(
          tabName = "t_item2",
          fluidRow(
            output$table1 <- renderDataTable({
              iris
            }),
            box(
              title = "Controls",
              sliderInput("slider", "observations:", 1, 100, 50)
            )
          )
        )
      )
    } else {
      login
    }
  })
}