只是想知道这是否可行。我有一个应用程序,显示某些文件的链接,并希望在用户单击其中一个链接时打开一个单独的闪亮应用程序。
答案 0 :(得分:2)
要在外部打开链接,您可以插入:
tag("a", list(href = "http://www.myapps.com/otherapp", "Other App"))
" a" HTML(语言)中的标记用于表示一般来说的链接,href
属性是插入路径的位置。下面我使用所有Shiny App画廊和帮助链接汇总了一个快速示例
ui <- bootstrapPage(
tag('ul',
lapply(read_html("http://shiny.rstudio.com/gallery/") %>%
xml_find_all('//a'), function(i){
li <- url_absolute(xml_attr(i, 'href'), xml_url(i))
data.frame(li = li,
txt = stri_trans_totitle(
trimws(gsub("\\-|\\.html"," ",basename(li)))),
stringsAsFactors = FALSE)
}) %>% rbind.pages() %>%
dplyr::filter(!duplicated(txt)) %>% apply(., 1, function(x){
tag("li",list(tag("a", list(href = x[[1]],x[[2]]))))
}))
)
server <- function(session, input, output){
}
shinyApp(ui, server)
对于您可以使用的任何外部应用程序链接:
ext.link <- function(label = NULL, link = NULL){
tag("a", list(href = link,
ifelse(!is.null(label), label, basename(link))))
}
哪会在你的应用中产生html:
> ext.link(label = "New app", link = "http://mypage.com/new_app")
<a href="http://mypage.com/new_app">New app</a>
答案 1 :(得分:0)
谢谢卡尔, 我遇到了类似的问题,另外需要创建一个动态链接,该链接会根据某些用户操作而变化。 我以这种方式解决了(我重新调整了您的Shiny.rstudio.com/gallery代码)
extract_info <- function(html_line) {
li <- url_absolute(xml_attr(html_line, 'href'), xml_url(html_line))
data.frame(li = li,
txt = stri_trans_totitle(trimws(gsub("\\-|\\.html", " ", basename(li)))),
stringsAsFactors = FALSE)
}
mydata.df <- lapply(read_html("http://shiny.rstudio.com/gallery/") %>%
xml_find_all('//a'),
function(line) extract_info(line)) %>%
rbind_pages() %>%
dplyr::filter(!duplicated(txt))
ui <- fluidPage(
titlePanel("Select shiny apps"),
sidebarLayout(
sidebarPanel(
numericInput(inputId = "myline", label = "Select one line",
value = 1, min = 1, max = NA, step = 1),
uiOutput("wantedlink")
),
mainPanel(DT::dataTableOutput("mytable"))
)
)
server <- function(session, input, output) {
output$mytable <- DT::renderDataTable({ DT::datatable( mydata.df ) })
mylink <- reactive({
mydata.df$li[input$myline] })
mytext <- reactive({
mydata.df$txt[input$myline] })
output$wantedlink <- renderUI({
HTML(sprintf('<a href = %s target = "_blank">%s</a>', as.character(mylink()), mytext()))
})
}
shinyApp(ui, server)