Ярлыки оси Y не будут выравниваться по правому краю в блестящем с помощью ggiraph - PullRequest
0 голосов
/ 24 апреля 2020

Я не могу выровнять метки по оси Y в этом блестящем приложении , используя ggiraph .

Пожалуйста, найдите работающее приложение здесь, изображение проблемы, код и приложение: https://eduardo757ag.shinyapps.io/test_labels/

Я пробовал с темой (ось. text.y = element_text (hjust = 1)) безрезультатно.

Спасибо за помощь!

enter image description here


название: "test1" автор: "edu" дата: '' вывод: html_document: выделение: тема танго: время выполнения журнала: блестящий


library(tidyverse)
library(ggiraph)
library(shiny)
library(survey)

data(api)

api_test <- apiclus1 %>% 
  dplyr::group_by(cname) %>% 
  dplyr::summarise_at(vars(acs.k3:acs.46), mean,na.rm=T) %>% 
  pivot_longer(2:3,names_to = "variable",values_to = "value") %>% 
  dplyr::mutate(    
    IOMmission = 
      case_when(cname=="Alameda" ~ "A very very long long label, yes",
                T~cname))

api_test$tooltip <- c(paste0(api_test$cname, "\n", api_test$value))

shinyApp(

  # ui.R ----
ui <- fluidPage(
    sidebarLayout(

        sidebarPanel(
          selectInput(inputId = "Variable",
                        label = "Select a survey question",
                        choices= unique(api_test$variable)),

          width = 4,
          style = "font-family: 'Georgia'"),

        mainPanel(
          girafeOutput("mygplot1"),
          width = 8))
),

# server.R ----
server <- function(input, output) {

    output$mygplot1 <- renderGirafe({

      girafe(ggobj =

               ggplot(

                 api_test, aes(x= value , 
                               y=reorder(cname,value),
                               tooltip=tooltip,
                               data_id=cname)) +
        geom_bar_interactive(
          aes(alpha=.5),
          stat='identity',
          fill = "#56B4E9",
          data= api_test[api_test$variable == input$Variable, ]) +

          labs(
          y = NULL,
          x = "Average",

          caption = paste("Data X: ", api_test[api_test$variable == input$Variable, ]$value),
          title=input$Variable) +

          geom_vline(xintercept = 0, color="black", size=1) +

          scale_x_continuous(
               position = "top",
               labels = scales::number_format(suffix = "%"),
               expand = expand_scale(mult = c(0, 0.05))) +

          theme(
            axis.text.y = element_text(hjust=1),
            plot.title.position = "plot",
            panel.grid.major.y = element_blank(),
            panel.grid.major.x = element_line(size = 1, colour = "grey80"),
            panel.grid.minor.x = element_blank(),
            legend.position = "none",
            text=element_text(family="Georgia",size=12))
        ,
        height_svg=10,
        width_svg =8) %>%

        girafe_options(ggiraph::opts_hover(css="fill:#22222288;cursor:pointer;"))
  })},      
options = list(height = 740))

...