Hover on a series to highlight it:
# devtools::install_github("ropensci/github#554")
library(plotly)
library(crosstalk)
d <- SharedData$new(txhousing, ~city)
p <- ggplot(d, aes(date, median, group = city)) + geom_line()
ggplotly(p, tooltip = "city") %>%
highlight(on = "plotly_hover", color = "red")