- html - 出于某种原因,IE8 对我的 Sass 文件中继承的 html5 CSS 不友好?
- JMeter 在响应断言中使用 span 标签的问题
- html - 在 :hover and :active? 上具有不同效果的 CSS 动画
- html - 相对于居中的 html 内容固定的 CSS 重复背景?
我已经设置了以下 Shiny 代码:
全局.R:
library(shiny)
library(gapminder)
library(tidyverse)
library(scales)
用户界面:
fluidPage(
titlePanel("Gapminder Hierarchical Clustering of Countries"),
sidebarLayout(
sidebarPanel(
sliderInput("numCluster", "Choose number of clusters:", 2, 6, 2),
checkboxGroupInput("ContinentSelect", "Select which continents to include in the cluster analysis:",
choices = levels(gapminder$continent), selected = levels(gapminder$continent)),
sliderInput("numYear", "Select years to include in the cluster analysis:", min(gapminder$year), max(gapminder$year),
c(min(gapminder$year), max(gapminder$year)), step = 5, ticks = FALSE, sep = "")
),
mainPanel(
plotOutput("Chart"),
br(),br(),
tableOutput("SummaryClusters")
)
)
)
和服务器.R:
function(input, output){
gapcluster <- function(df, numCluster){
df_scaled <- df %>% mutate(scale_lifeExp = scale(lifeExp),
scale_pop = scale(pop),
scale_gdpPercap = scale(gdpPercap))
gapclusters <- df_scaled[,c("scale_lifeExp", "scale_pop", "scale_gdpPercap")] %>% dist() %>% hclust()
Clustercut <- cutree(gapclusters, numCluster)
return(Clustercut)
}
#Creating a data frame based on inputs
filtered_gap <- reactive({ #If no continents are selected
if (is.null(input$ContinentSelect)) {
return(NULL)
}
gapminder %>%
filter(year >= input$numYear[1],
year <= input$numYear[2],
continent == input$ContinentSelect)
})
filtered_gap2 <- reactive({
filtered_gap() %>% mutate(cluster_group = gapcluster(filtered_gap(), input$numCluster),
country = reorder(country, -1 * pop)) %>%
arrange(year, country)
})
SummaryTable <- reactive({
if (is.null(input$ContinentSelect)) {
return(NULL)
}
filtered_gap2() %>% group_by(cluster_group) %>% summarise(`Number of countries` = n(),
`Life expectancy` = mean(lifeExp),
`Population size` = prettyNum(mean(pop), big.mark = ","),
`GDP per capita` = prettyNum(mean(gdpPercap), big.mark = ",")) %>%
rename(`Cluster Group` = cluster_group)
})
output$Chart <- renderPlot({
if (is.null(filtered_gap2())) {
return()
}
filtered_gap2() %>% ggplot(aes(x = gdpPercap, y = lifeExp, fill = country)) +
scale_fill_manual(values = country_colors) +
facet_wrap(~ cluster_group) +
geom_point(aes(size = pop), pch = 21, show.legend = FALSE) +
scale_x_log10(limits = c(230, 115000), labels = comma) +
scale_size_continuous(range = c(1,40)) + ylim(c(20, 87)) +
labs(x = "GDP per capita", y = "Life Expectancy")
})
output$SummaryClusters <- renderTable({
SummaryTable()
})
}
大陆的过滤方式存在问题。在默认设置下,我们可以看到表格中共有 344 个国家/地区。但如果我取消选中大洋洲,这个数字就会上升(?)到 420 个国家/地区。到底是怎么回事?我相当确定这个问题与 server.R 文件中的 filter(continent == input$ContinentSelect)
行有关,但我不知道如何解决它。
最佳答案
当我将 filter(continent == input$ContinentSelect)
更改为 filter(continent %in% input$ContinentSelect)
时,它会起作用。菜鸟错误。
关于R Shiny - 如何通过 checkboxGroupInput 进行过滤,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/40790233/
在类似的帖子 ( How to align a group of checkboxGroupInput in R Shiny) 中,复选框仅垂直对齐(如我的示例)或仅水平对齐(R Shiny disp
这是带有复选框组输入的示例代码: library(shiny) server my_max){ updateCheckboxGroupInput(session, "SelecetedV
我有一个包含 checkboxGroupInput 的 R Shiny 应用程序,我正在尝试使用 updateCheckboxGroupInput 函数创建一个“全选”按钮。 你可以在下面看到完整的代
我正在使用 R shiny 开发交互式分析工具。现在我想根据checkboxGroupInput中的变量检查做分类树。如何选择该数据子集?谢谢! 用户界面: dateInput("dat
我是 R 新手,我在 Ui.R 中有这段代码: library(shiny) ui <- shinyUI(fluidPage( titlePanel("Test 1"), sidebarLay
我想使用 checkboxGroupInput,然后,如果选中某个框,我想要一个条件面板。一个玩具示例在这里: shinyUI(fluidPage( sidebarLayout( sidebar
如何修改以下代码,使 'checkboxGroupInput' 的选项包含在 'width: 200px' 内? library(shiny) ui <- fluidPage( tags$styl
在我的 Shiny UI 中有 ui <- checkboxGroupInput("my_cbgi", "Choose Something", c("A", "B", "C", "D")) 我希望选项
我的 Shiny 应用中有一个 checkboxGroupInput,代码如下: checkboxGroupInput("sexe", "Sexe:", c("Masculin" = "mas","F
如何显示 checkboxGroupInput水平(内联块)与 R Shiny ? 最佳答案 你可以这样做: checkboxGroupInput(inputId="test", label="Tes
我已经设置了以下 Shiny 代码: 全局.R: library(shiny) library(gapminder) library(tidyverse) library(scales) 用户界面:
我已经设置了以下 Shiny 代码: 全局.R: library(shiny) library(gapminder) library(tidyverse) library(scales) 用户界面:
我有这些数据 我想使用 R shiny scatter plot > 服务器: library(dplyr) library(permute) set.seed(1) meta.df % dplyr:
我有一个与 this one 相关的问题, 但无法为我找到解决方案。 我有一个 react 性 ggplot,我想使用基于组数据的复选框来更新它。 目前,当我选择了一个框时,数据显示正确。如果我选择了
我创建了一组 checkboxGroupInput使用下面的代码,但显示不正确。 它看起来像这样: 知道如何在 Shiny 中强制正确对齐吗? 用户界面 uiOutput(outputId = "nu
我想根据复选框输入动态选择的列来子集我的数据。有什么方法可以让我的输入文件在我的代码中全局可用以便可以轻松执行进一步的操作。 以下是我的代码: 服务器.R library(shiny)
我正在尝试在一个应该绘制图形的 Shiny 应用程序中包含复选框。我的问题看起来很简单,但我无法自己解决 :( ,尽管 StackOverflow 或 R 帮助工具上有多个 CheckboxGroup
我正在尝试创建一个应用程序,其最终目标是选择满足用户使用 Shiny 元素(checkboxGroupInput, sliderInput, etc)选择的某些条件的矩阵的行 出于示例目的,让我们将数
我是一名优秀的程序员,十分优秀!