Translating HTML coordinates to plot coordinates

I would like to have Shiny user annotate an R plot using JavaScript. The reason to do that is speed - it takes a long time to recreate the R plot.

I came up with a solution where I superimpose HTML canvas element of the same size as the plot on top of the R plot, and use HTML mouse handler to react to user actions.

However, I am unable to translate mouse events' locations (e.g. event.offsetX) to the coordinates of the original plot.

Any idea how to do that? Thanks, -Ondrej

Hi,

Would you be able to provide a minimal reproducible example:

Thanks

Hi,

here's the app demonstrating the problem. I would like to know the PLOT x-coordinate where user clicked.

--Ondrej

library(shiny)
library(shinyjs)
library(phonTools)

# Define UI for application that draws on a spectrogram
ui <- fluidPage(
  tags$head(
    tags$style(HTML("
                    .spectrum {
                      position: absolute;
                      left: 0;
                      top: 0;
                      width: 600px;
                      height: 400px;
                    }
                    
                    .wrapper {
                      position: relative;
                      width: 600px; 
                      height: 400px;
                      visibility: visible;
                      -moz-user-select: none;
                      -webkit-user-select: none;
                      -ms-user-select: none;
                      user-select: none;
                    }
                    
                    #allSpectrum {
                      position: relative;
                    }
                    "))
    
  ),
  titlePanel("Wait for image load, and then click on the spectrogram!"),
  useShinyjs(),
  
  bootstrapPage(
    tags$script(HTML(
      "
      spectrum1_click = function(event) {
        var canvas = document.getElementById('spectrum1');
        if (canvas.getContext) 
        {
          var context = canvas.getContext('2d');
          
          context.clearRect(0, 0, 600, 400);
          // Reset the current path
          context.beginPath(); 
          context.moveTo(event.offsetX, 0);
          context.lineTo(event.offsetX, 1400);
          context.stroke();
          Shiny.setInputValue('x1', event.offsetX)
        }  
      };
      "
    )),
    
    # Show a spectogram
    mainPanel(
      div(class="wrapper",
          plotOutput("allSpectrum", click = "plot1_click"),
          HTML("<canvas id='spectrum1' class='spectrum' width=600 height=400 onclick='spectrum1_click(event)'></canvas>")
      ),
      textOutput("xpos")
    )
  )
)

server <- function(input, output, session) {
  data(sound)
  spec1 = spectrogram(sound, windowlength = 24, show = F)
  
  output$allSpectrum <- renderPlot({
    plot(spec1)
  })
  
  output$xpos <- renderText( {
    input$x1
  })
}

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

For illustration, here's pure R code without using HTML, which almost does what is needed i.e. draws a line on a click and obtains the x value in plot (data) coordinate system.

Notice, how much slower this is compared to HTML version, and also note the additional problem that a single click is reacted to twice.

library(shiny)
library(shinyjs)
library(phonTools)
library(fftw)

# Define UI for application that draws on a spectrogram



ui <- fluidPage(

  titlePanel("Wait for image load, and then click on the spectrogram!"),
  useShinyjs(),
  
  bootstrapPage(
  
    
    # Show a spectogram
    mainPanel(
      div(class="wrapper",
          plotOutput("allSpectrum", click = "plot1_click")
    
      ),
      textOutput("xpos")
    )
  )
)

server <- function(input, output, session) {
  data(sound)
  spec1 = spectrogram(sound, windowlength = 24, show = F)
  
  output$allSpectrum <- renderPlot({
    plot(spec1)
    ipc <- input$plot1_click
    if (!is.null(ipc)) {
      abline(v = ipc$x, col = "purple")
    }
  })
  
  output$xpos <- renderText( {
    ipc <- input$plot1_click
    if (is.null(ipc)) 'not clicked' else ipc$x
  })
}

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

Hi,

I found a solution! I'm so happy as this question of yours made me spent 2 days searching for a solution as I was convinced there was a way, but I didn't have the JS skills :slight_smile:

This is the code:

library(shiny)
library(shinyjs)
library(phonTools)

# Define UI for application that draws on a spectrogram
ui <- fluidPage(
 tags$head(
   tags$style(HTML("
                   .spectrum {
                     pointer-events: none;
                     position: absolute;
                     left: 0;
                     top: 0;
                     width: 600px;
                     height: 400px;
                   }
                   
                   .wrapper {
                     position: relative;
                     width: 600px; 
                     height: 400px;
                     visibility: visible;
                     -moz-user-select: none;
                     -webkit-user-select: none;
                     -ms-user-select: none;
                     user-select: none;
                   }
                   
                   #allSpectrum {
                     position: relative;
                   }
                   "))
   
 ),
 titlePanel("Wait for image load, and then click on the spectrogram!"),
 useShinyjs(),
 
 
 
 bootstrapPage(
   tags$script(HTML(
     "
     $(document).on('shiny:inputchanged', function(event) {
       if (event.name === 'plot1_click') {
         console.log(event.value);
         var canvas = document.getElementById('spectrum1');
         if (canvas.getContext) 
         {
           var context = canvas.getContext('2d');
           context.clearRect(0, 0, 600, 400);
           // Reset the current path
           context.beginPath(); 
           context.moveTo(event.value.coords_css.x +15, 0);
           context.lineTo(event.value.coords_css.x +15, 1400);
           context.stroke();
         } 
       }
     });
     "
   )),
   
   # Show a spectogram
   mainPanel(
     div(id ="wrapper",
         plotOutput("allSpectrum", click = "plot1_click"),
         HTML("<canvas id='spectrum1' class='spectrum' width=600 height=400'></canvas>")
     ),
     textOutput("xpos")
   )
 )
)

server <- function(input, output, session) {
 data(sound)
 spec1 = spectrogram(sound, windowlength = 24, show = F)
 
 output$allSpectrum <- renderPlot({
   plot(spec1)
 })
}

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

EXPLANATION

Step 1: registering the click on the plot behind the canvas
I found out that you are able through css to make elements 'invisible' for clicks using the pointer-events: none; attribute. This means that if there is an element behind the ignored one, that one will receive the click instead. In our case, we have the plot in the background receiving the click, and the spectrum element on top that will be visible, but not receive clicks. (see the CSS for .spectrum)

Step 2: capturing the plot click in JS
Shiny is the one creating the click event (plot1_click) but we don't want it to trigger any R code as it would refresh the plot. Instead, we divert the event to JS. I figured out this can be done with line $(document).on('shiny:inputchanged', function(event) {}. For a full list of things JS observes see this page.

Event has 3 attributes for shiny:inputchanged, of which the name and value are the ones of interest. By filtering on name, we ensure that the code will only trigger when the plot is clicked. if (event.name === 'plot1_click') {}

Step 3: plot the line in the spectrum div
By using the debug line console.log(event.value); I was able to see the content of the Shiny click event object in the console of my browser. After some experimentation, I then found out the attribute event.value.coords_css.x was the one I was looking for. All I did then was plug that into the code you'd written before, and the line was plotted! I did however have to adjust the value by 15 px as I think this is because of the plot margins.

So there you go, a complex plot with a super fast CSS line plotted over it :slight_smile:

Let me know what you think...
Grtz,
PJ

5 Likes

Hi Pieter,

thank you very much for cracking this nut!

I was thinking about attacking the problem a little differently, being unaware of the pointer-events: none; attribute. Since the plot takes too long to render initially, for better user experience, as well as to get the coordinates right, I thought about precomputing the bitmap image and storing it together with the plot coordinate mapping in a database.

The app will be done in 3-4 weeks, I'll let you know how it worked out.

--Ondrej

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