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