{-# LANGUAGE OverloadedStrings #-}
module Network.MPD.Commands.Output
( disableOutput
, enableOutput
, toggleOutput
, outputs
) where
import qualified Network.MPD.Applicative.Internal as A
import qualified Network.MPD.Applicative.Output as A
import Network.MPD.Core
import Network.MPD.Commands.Types
disableOutput :: MonadMPD m => Int -> m ()
disableOutput = A.runCommand . A.disableOutput
enableOutput :: MonadMPD m => Int -> m ()
enableOutput = A.runCommand . A.enableOutput
toggleOutput :: MonadMPD m => Int -> m ()
toggleOutput = A.runCommand . A.toggleOutput
outputs :: MonadMPD m => m [Device]
outputs = A.runCommand A.outputs