Remove only negative symbol from Ramcharts

Wanted to check if we can remove only negative symbols (-) from the ramcharts. The negative values are shwing in opposite direction which is fine. But only (-) should be removed. Is it possible?

library(shiny)
library(dplyr)
library(shinycssloaders)
library(DT)
library(rAmCharts)

ui <- fluidPage(

    actionButton("plot","plot"),
    dataTableOutput("Test"),
    amChartsOutput("iris_data")

)



server <- function(input, output, session) {

    observeEvent(input$plot, {
        output$Test <- DT::renderDT(DT::datatable(head(iris),
                                                  rownames = FALSE, options = list(dom = 't', 
                                                                                   ordering=FALSE)))

    })
    output$iris_data <-  renderAmCharts({
        pipeR::pipeline(
            amBarplot(
                x = "Species",
                y = c("new", "Sepal.Width"),
                data = head(iris),
                stack_type = "regular",
                labelRotation = 90,
                groups_color = c( "#33A532","#f94c56")
            ),
            setChartCursor()
        )
    })
}
shinyApp(ui = ui, server = server)

This topic was automatically closed 54 days after the last reply. New replies are no longer allowed.