Ошибка CoordTern требует следующую отсутствующую эстетику (tlr-> xy): z при использовании ggtern в Shiny - PullRequest
0 голосов
/ 13 апреля 2020

Я пытаюсь написать приложение Shiny, которое читает файл с составом трехкомпонентных систем и строит тройную фазовую диаграмму с помощью пакета ggtern.

Я могу сделать это в basi c R, но при попытке реализовать его как часть Shiny я получаю и ошибку, которую я не знаю, как исправить:

Ошибка: CoordTern требует следующую отсутствующую эстетику (tlr-> xy): z

Приложение состоит из виджета fileInput и трех виджетов selectInput, являющихся частью функций renderUI, чтобы пользователь мог выбрать переменную для каждого угла троичного графика из файла.

Я использую последние версии библиотеки: ggplot2 3.3.0 и ggtern 3.3.0

Это содержимое файла .csv в виде фрейма данных:

df <- data.frame("Comp1" = c(0.3, 0.5, 0.6, 0.75, 0.8),
                 "Comp2" = c(0.3, 0.25, 0.15, 0.15, 0.1),
                 "Comp3" = c(0.4, 0.25, 0.25, 0.1, 0.1),
                 "Value" = c(300, 500, 1200, 2500, 4500))

Создано в 2020 году -04-13 в пакете Представить (v0.2.1)

Ниже представлен пример блестящего кода:

#
# Ternary Phase Plot
#

library(shiny)
library(ggplot2)
library(ggtern)
#> --
#> Remember to cite, run citation(package = 'ggtern') for further info.
#> --
#> 
#> Attaching package: 'ggtern'
#> The following objects are masked from 'package:ggplot2':
#> 
#>     aes, annotate, ggplot, ggplot_build, ggplot_gtable,
#>     ggplotGrob, ggsave, layer_data, theme_bw, theme_classic,
#>     theme_dark, theme_gray, theme_light, theme_linedraw,
#>     theme_minimal, theme_void
library(DT)
#> 
#> Attaching package: 'DT'
#> The following objects are masked from 'package:shiny':
#> 
#>     dataTableOutput, renderDataTable

ui <- fluidPage(
  titlePanel("Ternary Phase Plot"),
  sidebarLayout(
    sidebarPanel(

      fileInput("file","Upload '.csv' file"),
      br(),
      uiOutput("vx"), # vx is coming from renderUI in server
      br(),
      uiOutput("vy"), # vy is coming from renderUI in server
      br(),
      uiOutput("vz") # vy is coming from renderUI in server
    ),

    mainPanel(
      plotOutput("plot", height = "800px"),
      DT::dataTableOutput("table")
    )
  )
)


server <- function(input, output, session) {
  # get the names of the variables from the data file and used them in the selectInput part of the renderUI function
  vars <- reactive({
  req(input$file)
  names(read.csv(input$file$datapath,
                 header = TRUE,
                 sep = ","))
  })
  # read the data file
  df <- reactive({
    req(input$file)
    read.csv(input$file$datapath,
                   header = TRUE,
                   sep = ",")
  })

  output$vx <- renderUI({
    selectInput("varx", "Select the 1st (L) component", choices = vars())
  })

  output$vy <- renderUI({
    selectInput("vary", "Select the 2nd (T) component", choices = vars())
  })

  output$vz <- renderUI({
    selectInput("varz", "Select the 3rd (R) component", choices = vars())
  })

  # render plot
  output$plot <- renderPlot({

    ggtern(df(), aes_string(x=input$varx, y=input$vary, z=input$varz)) + 
      geom_point(aes(fill=Value), color="black",shape=21, size=6) +
      labs(fill="Value")


  })

  # print dataframe in table to confirm it is read properly
  output$table <- DT::renderDataTable(
    df()
  )

}

# Run the application 
shinyApp(ui = ui, server = server)

1 Ответ

0 голосов
/ 18 апреля 2020

Я нашел ответ на мою проблему из другого вопроса о переполнении стека ({ ссылка }). Это сработало, хотя был дан ответ для решения другой проблемы. Функция ggtern должна быть помещена в команду print ().

...