module Mpv.Data.Subtitle where import Polysemy.Time.Json (json) import Mpv.Data.SubtitleId (SubtitleId) data Subtitle = Subtitle { Subtitle -> Maybe SubtitleId id :: Maybe SubtitleId, Subtitle -> Bool selected :: Bool, Subtitle -> Maybe Text language :: Maybe Text } deriving stock (Subtitle -> Subtitle -> Bool (Subtitle -> Subtitle -> Bool) -> (Subtitle -> Subtitle -> Bool) -> Eq Subtitle forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: Subtitle -> Subtitle -> Bool $c/= :: Subtitle -> Subtitle -> Bool == :: Subtitle -> Subtitle -> Bool $c== :: Subtitle -> Subtitle -> Bool Eq, Int -> Subtitle -> ShowS [Subtitle] -> ShowS Subtitle -> String (Int -> Subtitle -> ShowS) -> (Subtitle -> String) -> ([Subtitle] -> ShowS) -> Show Subtitle forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Subtitle] -> ShowS $cshowList :: [Subtitle] -> ShowS show :: Subtitle -> String $cshow :: Subtitle -> String showsPrec :: Int -> Subtitle -> ShowS $cshowsPrec :: Int -> Subtitle -> ShowS Show, (forall x. Subtitle -> Rep Subtitle x) -> (forall x. Rep Subtitle x -> Subtitle) -> Generic Subtitle forall x. Rep Subtitle x -> Subtitle forall x. Subtitle -> Rep Subtitle x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep Subtitle x -> Subtitle $cfrom :: forall x. Subtitle -> Rep Subtitle x Generic) json ''Subtitle