{-# LANGUAGE OverloadedStrings #-}
module Network.MPD.Commands.Status
( clearError
, currentSong
, idle
, noidle
, stats
, status
) where
import qualified Network.MPD.Applicative.Internal as A
import qualified Network.MPD.Applicative.Status as A
import Network.MPD.Commands.Types
import Network.MPD.Core
clearError :: MonadMPD m => m ()
clearError :: forall (m :: * -> *). MonadMPD m => m ()
clearError = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand Command ()
A.clearError
currentSong :: MonadMPD m => m (Maybe Song)
currentSong :: forall (m :: * -> *). MonadMPD m => m (Maybe Song)
currentSong = Command (Maybe Song) -> m (Maybe Song)
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand Command (Maybe Song)
A.currentSong
idle :: MonadMPD m => [Subsystem] -> m [Subsystem]
idle :: forall (m :: * -> *). MonadMPD m => [Subsystem] -> m [Subsystem]
idle = Command [Subsystem] -> m [Subsystem]
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command [Subsystem] -> m [Subsystem])
-> ([Subsystem] -> Command [Subsystem])
-> [Subsystem]
-> m [Subsystem]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Subsystem] -> Command [Subsystem]
A.idle
noidle :: MonadMPD m => m ()
noidle :: forall (m :: * -> *). MonadMPD m => m ()
noidle = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand Command ()
A.noidle
stats :: MonadMPD m => m Stats
stats :: forall (m :: * -> *). MonadMPD m => m Stats
stats = Command Stats -> m Stats
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand Command Stats
A.stats
status :: MonadMPD m => m Status
status :: forall (m :: * -> *). MonadMPD m => m Status
status = Command Status -> m Status
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand Command Status
A.status