{-# LANGUAGE DataKinds #-}

module MusicScroll.Providers.Utils where

import Data.Text (Text)
import MusicScroll.TrackInfo (TrackInfo)
import Network.HTTP.Req

newtype Lyrics = Lyrics Text

instance Show Lyrics where
  show :: Lyrics -> String
show Lyrics
_ = String
"Lyrics"

data Provider = Provider
  { Provider -> TrackInfo -> Url 'Https
toUrl :: TrackInfo -> Url 'Https,
    Provider -> Text -> Lyrics
extractLyricsFromPage :: Text -> Lyrics
  }