- html - 出于某种原因,IE8 对我的 Sass 文件中继承的 html5 CSS 不友好?
- JMeter 在响应断言中使用 span 标签的问题
- html - 在 :hover and :active? 上具有不同效果的 CSS 动画
- html - 相对于居中的 html 内容固定的 CSS 重复背景?
运行 Shiny 的应用程序时出现错误。该错误似乎在 ui.R 中,但我已经检查了很多次,但仍然无法弄清楚。有人有想法吗?
这是我的代码:
ui.R
require(shiny)
library(radarchart)
shinyUI(navbarPage("Attitude analysis",
tabPanel("Gender & Age Group",
fluidPage(
fluidRow(
column(width = 3, wellPanel(
selectInput("select1", label=("Age Group"),
choices=list("Age 18-24","Age 25-44","Age 45-64","Age 65+"),
selected = "Age 18-24")
))),
fluidRow(
column(width = 12,
chartJSRadarOutput("plot1", width = "300", height = "100")
),
column(width = 12,
chartJSRadarOutput("plot2", width = "300", height = "100")
)
))
),
tabPanel("Attitude Comparison",
fluidPage(
sidebarLayout(
# Sidebar with slider input
sidebarPanel(h4("Baseline"),
radioButtons("select2", label=("familiarity"),
choices=list("0"=0,"1"=1 ),
selected = 0 ),
radioButtons("select3", label=("favorability"),
choices=list("0"=0,"1"=1 ),
selected = 0 ),
radioButtons("select4", label=("consideration"),
choices=list("0"=0,"1"=1 ),
selected = 0 )
),
sidebarPanel(h4("Comparison"),
radioButtons("select5", label=("familiarity"),
choices=list("0"=0,"1"=1 ),
selected = 0 ),
radioButtons("select6", label=("favorability"),
choices=list("0"=0,"1"=1 ),
selected = 0 ),
radioButtons("select7", label=("consideration"),
choices=list("0"=0,"1"=1 ),
selected = 0 )
),
# Show a plot of the generated distribution
mainPanel(
plotOutput("plot3", width=900,height = 450)
)
))
)
))
server.R
server <- function(input, output) {
library(shiny)
library(radarchart)
library(ggplot2)
library(reshape2)
top_version<-read.csv("top_version.csv",header = T)
top_version<-top_version[,2:26]
output$plot1 <- renderChartJSRadar({
ds<-subset(top_version,top_version$ageInd==input$select1)
labs<-c('familiarity','favorability','consideration')
scores<-list('Women'=c(nrow(ds[ds$familiarity==1 & ds$gender==2,])/nrow(ds[ds$gender==2,]),nrow(ds[ds$favorability==1 & ds$gender==2,])/nrow(ds[ds$gender==2,]),nrow(ds[ds$consideration==1 & ds$gender==2,])/nrow(ds[ds$gender==2,])),
'Men'=c(nrow(ds[ds$familiarity==1 & ds$gender==1,])/nrow(ds[ds$gender==1,]),nrow(ds[ds$favorability==1 & ds$gender==1,])/nrow(ds[ds$gender==1,]),nrow(ds[ds$consideration==1 & ds$gender==1,])/nrow(ds[ds$gender==1,])))
chartJSRadar(scores=scores, labs=labs,showToolTipLabel = T)
})
output$plot2 <- renderChartJSRadar({
labs<-c('familiarity','favorability','consideration')
scores2<-list("Age 18-24"=c(nrow(top_version[top_version$familiarity==1 & top_version$ageInd=="Age 18-24",])/nrow(top_version[top_version$ageInd=="Age 18-24",]),nrow(top_version[top_version$favorability==1 & top_version$ageInd=="Age 18-24",])/nrow(top_version[top_version$ageInd=="Age 18-24",]),nrow(top_version[top_version$consideration==1 & top_version$ageInd=="Age 18-24",])/nrow(top_version[top_version$ageInd=="Age 18-24",])),
"Age 25-44"=c(nrow(top_version[top_version$familiarity==1 & top_version$ageInd=="Age 25-44",])/nrow(top_version[top_version$ageInd=="Age 25-44",]),nrow(top_version[top_version$favorability==1 & top_version$ageInd=="Age 25-44",])/nrow(top_version[top_version$ageInd=="Age 25-44",]),nrow(top_version[top_version$consideration==1 & top_version$ageInd=="Age 25-44",])/nrow(top_version[top_version$ageInd=="Age 25-44",])),
"Age 45-64"=c(nrow(top_version[top_version$familiarity==1 & top_version$ageInd=="Age 45-64",])/nrow(top_version[top_version$ageInd=="Age 45-64",]),nrow(top_version[top_version$favorability==1 & top_version$ageInd=="Age 45-64",])/nrow(top_version[top_version$ageInd=="Age 45-64",]),nrow(top_version[top_version$consideration==1 & top_version$ageInd=="Age 45-64",])/nrow(top_version[top_version$ageInd=="Age 45-64",])),
"Age 65+"=c(nrow(top_version[top_version$familiarity==1 & top_version$ageInd=="Age 65+",])/nrow(top_version[top_version$ageInd=="Age 65+",]),nrow(top_version[top_version$favorability==1 & top_version$ageInd=="Age 65+",])/nrow(top_version[top_version$ageInd=="Age 65+",]),nrow(top_version[top_version$consideration==1 & top_version$ageInd=="Age 65+",])/nrow(top_version[top_version$ageInd=="Age 65+",])))
chartJSRadar(scores=scores2, labs=labs,showToolTipLabel = T)
})
output$plot3 <- renderPlot({
com_1<-subset(top_version,familiarity==as.integer(input$select2) & favorability==as.integer(input$select3) & consideration==as.integer(input$select4))
com_2<-subset(top_version,familiarity==as.integer(input$select5) & favorability==as.integer(input$select6) & consideration==as.integer(input$select7))
de_1<-rep(nrow(com_1),19)
sum_0<-apply(com_1[,1:19],2,sum)
portion_0<-sum_0/de_1
de_2<-rep(nrow(com_2),19)
sum_1<-apply(com_2[,1:19],2,sum)
portion_1<-sum_1/de_2
sum_overall<-apply(top_version[,1:19],2,sum)
portion_overall<-sum_overall/nrow(top_version)
df_0<-data.frame(i=names(top_version)[1:19],overall=portion_overall,baseline=portion_0,comparison=portion_1)
df<-melt(df_0,id="i")
ggplot(df, aes(x=i,y=value,colour=variable,group=variable))+
geom_line()+
theme(axis.text.x = element_text(angle = 90, hjust = 1))
})
}
Listening on http://127.0.0.1:5884 Warning: Error in match.arg: 'arg' must be NULL or a character vector Stack trace (innermost first):
54: match.arg
53: sidebarLayout
52: tag
51: tags$div
50: div
49: tagList
48: attachDependencies
47: bootstrapPage
46: fluidPage
45: tag
44: tags$div
43: div
42: tabPanel
41: navbarPage
40: shinyUI
1: runApp Error in match.arg(position) : 'arg' must be NULL or a character vector
最佳答案
您可以调用 sidebarLayout
(它在您的错误消息跟踪中)。
如果你看?sidebarLayout
, 它需要 4 个参数
function (sidebarPanel, mainPanel, position = c("left", "right"),
fluid = TRUE)
{
position <- match.arg(position)
...
mainPanel
你传入两个
sidebarPanel
s。这就是你得到这个论点的原因。
关于r - match.arg(位置): 'arg' must be NULL or a character vector 中的 Shiny 错误,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/39967867/
我正在尝试为匹配中的每个匹配呈现一些 HTML,但是,我不太确定 实际上是正确的。 更具体地说,我不确定我是否可以使用 v-bind:match='match'在与循环相同的元素上 v-for='ma
它具有看似简单的代码: method match(Any:U: |) { self.Str; nqp::getlexcaller('$/') = Nil } 但是,这是它的行为: (^3).matc
如果您想检查某项是否与正则表达式匹配,如果是,请打印第一组,您就可以了.. import re match = re.match("(\d+)g", "123g") if match is not N
以下两个查询的结果有差异吗? SELECT * FROM table1, table2 WHERE ( MATCH(table1.row1) AGAINST('searchstring' IN
我正在尝试为我的日志文件创建一个语法文件。它们采用以下格式: [time] LEVEL filepath:line - message 我的语法文件如下所示: :syn region logTime
String#match 和 Regexp#match 在匹配成功时返回一个 MatchData: "".match(//) # => # //.match("") # => # //.match(:
我的代码中有这个函数: func match(match: GKMatch, player playerID: String, didChangeState state: GKPlayerConnec
我对 match 和 case 之间的区别感到困惑。在 document ,其中提到match支持通用模式匹配。 > (define (m x) (match x [(list a
我在检查特定元素中的空 HTML 内容时遇到了问题。当我使用 someElement.trim().match("") 即使 HTML 内容为空,我有时也会得到 true。我改成了 someEleme
我正在尝试使用正则表达式查找包含特定词的两个词之间的所有内容,但是这些词是重复的,所以我没有得到我想要的匹配项。 例如,我想要“你好”和“再见”之间的所有内容,以便它们之间存在“苹果”一词: hell
我目前正在构建一个 PHP 脚本,它将在需要时响应 HTTP“304 Not Modified”。 (请参阅 question #2086712 了解我目前所做的事情)。 目前我回答以下问题: If-
给定以下 XML 10 我希望能够正确识别内部 的 s : result = subject.gsub(/]*>)/, '<') 解释: ]* # any number of charact
这个问题在这里已经有了答案: How to error handle 1004 Error with WorksheetFunction.VLookup? (3 个回答) 3年前关闭。 目标:查找输入
我已经尝试了好一阵子了,但是我似乎无法弄清楚这两者之间的区别。特别是,与数据数组有关的差异: PS C:>$myarray = "a", "ab", "abc" PS C:>$myarray -mat
我正在努力研究如何构建一个宏,让我可以将模式和结果以向量的形式传递给 core.match/match 。我希望能够做到这一点: (let [x {:a 1} patterns [[{:a
这个问题在这里已经有了答案: Reference - What does this regex mean? (1 个回答) 关闭 8 年前。 如果这看起来微不足道但只是为了理解正则表达式,请原谅我:
我的 MySQL 表中有大约 20 行,其 Title 列为 Elsewhere 并具有其他不同的列参数。 我目前正在使用这样的查询,因为我的大多数搜索(通过 PHP 文件)都需要我进行猜测。所以我使
当找到匹配时,我必须从字符串中删除单词 让我们看看 我的输入字符串是 “肯诺克斯路” 比赛表演中的单词表 街道 驾驶 道路 4. 车道 输出字符串应该是: KENOX 我正在使用 vb.net 作为此
我正在搜索以下形式的字符串模式: XXXAXXX # exactly 3 Xs, followed by a non-X, followed by 3Xs 所有的 X 必须是相同的字符,并且 A 不能
好吧,我是 gulp 和 sass 的新手,我正在努力让它发挥作用。我正确安装了所有东西,但我收到了这个愚蠢的错误。有解决办法吗? PS C:\Users\Bojan Kolano\Desktop\F
我是一名优秀的程序员,十分优秀!