Я рисую картинку, используя R с пакетами svgPanZoom, svglite, ggplot2 и глянцевый. Тем не менее, он может правильно отображаться в Rstudio, но не в Интернете. Есть ли варианты, чтобы решить это? Пожалуйста, запустите следующий код для деталей.
library(shiny)
library(svglite)
library(svgPanZoom)
library(ggplot2)
data<-data.frame(x=1:50,y=1:50)
x_position<-1:50
y_position<-1:50
ui <- pageWithSidebar(
headerPanel(""),
sidebarPanel(),
mainPanel(
column(width=12,svgPanZoomOutput(outputId = "main_plot",width=600,height=450))
))
server = shinyServer(function(input, output) {
output$main_plot <- renderSvgPanZoom({
p <- ggplot(data, aes(x = x, y = y)) + geom_point()
svgPanZoom(
svglite:::inlineSVG(show(p))
, controlIconsEnabled = T)
})
})
shinyApp(ui,server)
R studio:
Веб-сайт: