Set the x-axis of a line graph based on a shiny dateRangeInput()

Hello I have a simple shiny app which includes a line graph. Firstly the user selects BOTH CHOICES of the checkboxgroup then the dateRangeInput() loads the relative dates and then I want to be able to create a line graph which will have this date range in the x-axis. I am not sure which is the correct way to give the date range as input to my plot.

OriginId = c("INT", "DOM", "INT","DOM","INT","DOM") 
RequestedDtTm = c("2017-01-16 16:43:33
", "2017-01-17 16:43:33
", "2017-01-18 16:43:33
","2017-01-19 16:43:33",
                  "2017-01-18 16:43:33
","2017-01-19 16:43:33"                  )
ClientZIP=c(20000,24455,56000,45000,80000,45000)
testdata = data.frame(OriginId,RequestedDtTm,ClientZIP)  

## ui.R ##
library(shinydashboard)
library(plotly)

dashboardPage(
  dashboardHeader(),
  dashboardSidebar(),
  dashboardBody()
)

library(shinydashboard)

ui <- dashboardPage(
  dashboardHeader(title = "Basic dashboard"),

  ## Sidebar content
  dashboardSidebar(
    sidebarMenu(
      menuItem("Dashboard", tabName = "dashboard", icon = icon("dashboard")),
      menuItem("Change View", tabName = "widgets", icon = icon("th"))
    )
  ),

  ## Body content
  dashboardBody(
    tabItems(
      # First tab content
      tabItem(tabName = "dashboard",

              fluidRow(

                box(plotlyOutput("plot3",height = 250))

              )
      ),

      # Second tab content
      tabItem(tabName = "widgets",

              fluidRow(
                box(title="Line Graph",width = 12,
                    column(4,

                           checkboxGroupInput("checkGroup4", label = h3("Checkbox group"), 
                                              choices = list("Show Domestic" = "DOM", "Show International" = "INT"),
                                              selected = "DOM")
                    ),
                    column(4,
                           uiOutput("dt3")

                    ),
                    column(4,
                           uiOutput("n3")

                    )
                ))
      )

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



  output$plot3 <- renderPlotly({

    data<-subset(testdata[,c(2,3)],testdata$OriginId %in% input$checkGroup4)
    p <- plot_ly(data, x = format(as.Date(input$dateRange3), "%Y-%m"), y = ~ClientZIP, type = 'scatter', mode = 'lines')
  })

  output$dt3<-renderUI({
  dateRangeInput('dateRange3',
                 label = 'Date range',
                 start = min(subset(as.POSIXct(testdata$RequestedDtTm),testdata$OriginId %in% input$checkGroup4)), end = max(subset(as.POSIXct(testdata$RequestedDtTm),testdata$OriginId %in% input$checkGroup4))
  )
  })


    }