2014-12-31 7 views
5

Mam pozornie mały, ale trudny problem z funkcją reaktywną w aplikacji Shiny.Shiny: problemy z reaktywnością renderUI

Aplikacja jest zaprojektowana tak, aby wyświetlać lineChart po wybraniu firmy i wyświetlać wykres słupkowy wszystkich firm po wybraniu "Wszystkie". Na przykład przy wyborze:

Filtruj według kategorii 1 = 3 i Filtruj według kategorii 1: 2 w ui, tylko 4 firmy pozostają w firmach zrzutu i chcę mieć możliwość wyboru firmy A w spadku firm w dół, aby uzyskać wykres liniowy dla firmy A.

Problem polega na tym, że po wybraniu firmy A wyświetla ona lineChart dla firmy A przez 1 sekundę, a następnie przeskakuje z powrotem do "Wszystkie".

Myślę, że problem tkwi w następującej linii:

output$firm <- renderUI({ 
    selectInput("firm", "Filter by Firm:", 
      choices = c("All",as.character(unique(subset_data()$FIRM)))) 
    }) 

Wybory ja życzenie "All" i "firma X". Najpierw tworzy lineChart dla firmy X, a następnie tworzy wykres jako pod "Wszystkie". W ten sposób próbowałem usunąć "wszystko" z wyborów, ale to nie zadziałało.

Każda pomoc doceniona! Dzięki

Oto powtarzalne przykład:

Tworzenie przykładowych danych pierwszy:

set.seed(1) 
df <- data.frame(FIRM=rep(LETTERS[1:7],each=10), CATEG_1=rbinom(70,4,0.9),CATEG_2=rbinom(70,1,0.2),date=as.Date("2014-01-01")+1:10,y1=sample(1:100,70)) 

ShinyApp:

library(shiny) 
library(rCharts) 
library(doBy) 
library(plyr) 

shinyApp(ui = 
shinyUI(pageWithSidebar(

# Application title 
headerPanel("Example"), 

      sidebarPanel(
     uiOutput("firm"), 
     # selectInput("firm", "Filter by firm:", 
     # choices = unique(as.character(df))), 
     selectInput("categ_1", "Filter by Category 1:", 
        choices = c("All",unique(as.character(df$CATEG_1)))), 
     selectInput("date", "Filter by Date:", 
        choices = c("All","Last 28 Days","Last Quarter")), 
     selectInput("categ_2", "Filter by Category 2:", 
        choices = c("All",unique(as.character(df$CATEG_2))))   
     ), #sidebarPanel 

     mainPanel(
     h4("Example plot",style = "color:grey"), 
     showOutput("plot", "nvd3") 
     ) # mainPanel 
    ) #sidebarLayout 
) #shinyU 
, 
server = shinyServer(function(input, output, session) { 

subset_data <- reactive({df <- filter_data(df,input$firm, 
             input$date, 
             input$categ_1, 
             input$categ_2) 
         shiny::validate(need(!is.null(df),"No data to display")) 
         return(df)}) 

    output$firm <- renderUI({ 
    selectInput("firm", "Filter by Firm:", 
      choices = c("All",as.character(unique(subset_data()$FIRM)))) 
    })   

    output$plot<-renderChart2({ build_plot(subset_data()) }) 

############## 
#below are the functions used in the code 
############## 

# function for date subsetting 

    filter_date<-function(df,dateRange="All"){ 
    filt <- df 
    td <- max(as.Date(filt$date)) 
    if (dateRange=='Last 28 Days'){filt <-filt[filt$date>=(td-28),]} 
    if (dateRange=='Last Quarter'){filt <-filt[filt$date>=(td-84),]} 
    return(filt) 
    } # filter by date 

# function for data subsetting 

    filter_data<-function(df,firm=NULL,dateRange="All",categ_1=NULL,categ_2=NULL) 
    { 
    filt<-filter_date(df,dateRange) 

    if (!is.null(firm)) { 
    if(firm!='All') {filt <- filt[filt$FIRM==firm,]} 
    } 
    if (!is.null(categ_1)){ 
    if (categ_1!='All') {filt <- filt[filt$CATEG_1==categ_1,]} 
    } 
    if (!is.null(categ_2)) { 
    if (categ_2!='All') {filt <- filt[filt$CATEG_2==categ_2,]} 
    } 

    if(nrow(filt)==0) {filt <- NULL} 
    return(filt) 
    } # prepare data to be plotted 

# function to create plot 

    build_plot <- function(df) { 
    plotData<-df 
    # If 1 partner selected, time series is shown 
    if (length(as.character(unique(plotData$FIRM)))==1) { 

    tabledta<-summaryBy(y1~FIRM+date,data=plotData,FUN=sum,keep.names=TRUE) 

    filler = expand.grid(FIRM=as.character(unique(df$FIRM)), 
        date=seq(min(tabledta$date),max(tabledta$date),by='1 day')) 
    df = merge(filler, 
      tabledta, 
      by=c('date','FIRM'), 
      all.x=T) 
    df[is.na(df)]=0 
    p <- nPlot(y1 ~ date, group = 'FIRM', data = df, type = 'lineChart') 
    p$chart(margin=list(left=150)) 
    p$yAxis(showMaxMin = FALSE) 
    p$xAxis(tickFormat ="#!function(d) {return d3.time.format('%Y-%m-%d')(new Date(d * 24 * 60 * 60 * 1000));}!#") 
    p 
    } 
    # If "All" partners are selected, barchart of Top 5 is shown 
    else{ 
    SummaryTab<-aggregate(y1~FIRM,data=plotData,FUN=sum) 
    SummaryTab$rank=rank(SummaryTab$y1) 
    SummaryTab$rank[SummaryTab$rank>5]<-6 

    if (length(SummaryTab$rank)>5) { 
    #Top 5 partners in terms of y1 are shown 
    top5<-SummaryTab[SummaryTab$rank<=5,] 
    # other partners are collapsed, shown as 1 entry 

    others<-aggregate(y1~rank,data=SummaryTab,FUN=sum) 
    others<-others[others$rank==6,] 
    others$FIRM<-"Others" 

    # Create the summarytable to be plotted 
    plotData=rbind(top5,others)} 

    tabledta<-summaryBy(y1~FIRM,data=plotData,FUN=sum,keep.names=TRUE) 
    tabledta<-arrange(tabledta,y1) 
    # if(is.null(tabledta)) {print("Input is an empty string")} 

    p <- nPlot(y1 ~ FIRM,data = tabledta, type = 'multiBarHorizontalChart')  
    p$chart(margin=list(left=150)) 
    p$yAxis(showMaxMin = FALSE) 
    p 
    } 

    } 
    }) #shinyServer 
) 

Odpowiedz

5

Problem polega na tym, że wyjście $ firma jest self-reaktywnego w kodzie , ponieważ zależy od wejścia $ firma.

Wyrażenie $ wyrażenie sztywne generuje interfejs użytkownika dla wejścia $ firma, co automatycznie powoduje ponowną ocenę wszystkich wyrażeń reaktywnych, które zależą od wejścia $ form. Jednym z takich wyrażeń reaktywnych jest wyjście $ firma (zależy to od wejścia $ firma poprzez subset_data()), więc każde wywołanie wyjścia $ firma spowoduje jego rekurencyjną ponowną ocenę.

Co potrzebne jest do izolowania subset_data() wyrażenie, które będą zapobiegać wyzwalanie zmian subset_data():

output$firm <- renderUI({ 
input$date 
input$categ_1 
input$categ_2 
selectInput("firm", "Filter by Firm:", 
     choices = c("All",as.character(unique(isolate(subset_data()$FIRM))))) 
}) 

pamiętać, że włożona wejściowy kilka $ ... linii, aby upewnić się, że produkcja Firma $ uruchomi każdą zmianę tych danych wejściowych.

+0

Dziękuję, działa jak urok! – TinaW