Я получаю два предупреждения, которые я не совсем понимаю:
Warning in if (file == "") { :
the condition has length > 1 and only the first element will be used
Warning: Error in file: invalid 'description' argument
166: file
165: parse
163: renderPlot [...app.R#51]
161: func
121: drawPlot
107: <reactive:plotObj>
91: drawReactive
78: origRenderFunc
77: output$Minimum_Rates
1: runApp
Как новичок в R и Shiny, я понятия не имею, что я делаю неправильно. Скорее всего, в этой программе масса ошибок, но если бы кто-нибудь мог мне помочь с этими двумя текущими ошибками, это было бы здорово. Вот мой код:
library(shiny)
library(ggplot2)
library(dplyr)
library(rlang)
library(shinyWidgets)
library(rstudioapi)
ui <- fluidPage(
# Give the page a title
titlePanel("Rate Analysis"),
# Generate a row with a sidebar
sidebarLayout(
# Define the sidebar with one input
sidebarPanel(
selectInput("ProductType","Product Type: (Choose One)",choices=c("t","r")),
selectInput("inSelect","Carrier: (Choose One)",choices=unique(c(t_rates_names,r_rates_names))),
selectInput("Category","Category: (Choose One)",choices=c("Age","Term","Band","Class","Gender")),
sliderInput("discount","% Discount:",min=0,max=100,value=0),
width=3
),
# Create a spot for the barplot
mainPanel(
plotOutput("Minimum_Rates")
)
)
)
server <- function(input, output, session) {
observe({
req(input$ProductType)
x<-sym(input$ProductType)
updateSelectInput(session,"inSelect",label=paste("test"),choices=eval(parse(text=paste0(x,"_rates_names"))))
})
output$Minimum_Rates<-renderPlot({
req(input$inSelect)
req(input$Category)
req(input$discount)
req(input$ProductType)
carrier<-(input$inSelect)
carrier<-eval(parse(text=carrier))
category<-sym(input$Category)
discount<-input$discount
string_name=deparse(substitute(carrier))
fee_name=eval(parse(paste0(substr(string_name,1,nchar(string_name)-6),"_fees")))
carrier<-discountRatesAndFindNewPrems(carrier,discount/100,fee_name)
tMinTable<-removeTheseRatesAndFindMinimumRates(t_list_rates)
if(as_string(input$ProductType)=="t"){
carrier %<%
createRatesComparedToTMin(carrier) %<%
original_percent_higher<-Percent_Higher %<%
findRatesFromPrems(carrier,fee_name) %<%
original_rates<-`Rates per Thousand` %<%
group_by(!!!category) %>%
summarise(Current_Comparison=sum(original_percent_higher),Hypothetical_Comparison=sum(New_Percent_Higher)) %>%
ggplot(aes_string(input$category,"Current_Comparison"))+geom_bar(stat="identity",position="dodge") + geom_text(aes(label=scales::percent(Current_Comparison)),size=3.2,vjust=-0.5,position=position_dodge(width=1))
}
else{
rMinTable<-removeTheseRatesAndFindMinimumRates(r_list_rates)
carrier$Percent_Higher<-original_percent_higher
carrier<-createNewRatesComparedToRMin(carrier)
carrier%>%
group_by(!!!category) %>%
summarise(Current_Comparison=sum(original_percent_higher),Hypothetical_Comparison=sum(New_Percent_Higher))
ggplot(aes_string(input$Category,"Current_Comparison"))+geom_bar(stat="identity",position="dodge") + geom_text(aes(label=scales::percent(Current_Comparison)),size=3.2,vjust=-0.5,position=position_dodge(width=1))
}
})
}
shinyApp(ui=ui,server=server)
Другой вопрос, который у меня возникает, - это какой тип данных выбран? Являются ли они в основном тем типом, который я ввожу в параметре "choices"? Итак, если все мои варианты выбора являются строковыми, то зачем мне их преобразовывать в символ?
Редактировать: я добавил print (string_name) после строки string_name = deparse (substitute (carrier)), и похоже, что print (string_name) печатает весь df, в то время как я хотел получить имя df для string_name. Я думаю, что у меня есть некоторые недоразумения относительно того, каким должен быть тип данных «носитель». Кто-нибудь знает?