{-# LANGUAGE OverloadedStrings #-}
module Network.MPD.Commands.StoredPlaylists
( listPlaylist
, listPlaylistInfo
, listPlaylists
, load
, playlistAdd
, playlistClear
, playlistDelete
, playlistMove
, rename
, rm
, save
) where
import qualified Network.MPD.Applicative.Internal as A
import qualified Network.MPD.Applicative.StoredPlaylists as A
import Network.MPD.Commands.Types
import Network.MPD.Core
listPlaylist :: MonadMPD m => PlaylistName -> m [Path]
listPlaylist :: forall (m :: * -> *). MonadMPD m => PlaylistName -> m [Path]
listPlaylist = Command [Path] -> m [Path]
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command [Path] -> m [Path])
-> (PlaylistName -> Command [Path]) -> PlaylistName -> m [Path]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Command [Path]
A.listPlaylist
listPlaylistInfo :: MonadMPD m => PlaylistName -> m [Song]
listPlaylistInfo :: forall (m :: * -> *). MonadMPD m => PlaylistName -> m [Song]
listPlaylistInfo = Command [Song] -> m [Song]
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command [Song] -> m [Song])
-> (PlaylistName -> Command [Song]) -> PlaylistName -> m [Song]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Command [Song]
A.listPlaylistInfo
listPlaylists :: MonadMPD m => m [PlaylistName]
listPlaylists :: forall (m :: * -> *). MonadMPD m => m [PlaylistName]
listPlaylists = Command [PlaylistName] -> m [PlaylistName]
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand Command [PlaylistName]
A.listPlaylists
load :: MonadMPD m => PlaylistName -> m ()
load :: forall (m :: * -> *). MonadMPD m => PlaylistName -> m ()
load = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ())
-> (PlaylistName -> Command ()) -> PlaylistName -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Command ()
A.load
playlistAdd :: MonadMPD m => PlaylistName -> Path -> m ()
playlistAdd :: forall (m :: * -> *). MonadMPD m => PlaylistName -> Path -> m ()
playlistAdd PlaylistName
plname = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ()) -> (Path -> Command ()) -> Path -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Path -> Command ()
A.playlistAdd PlaylistName
plname
playlistClear :: MonadMPD m => PlaylistName -> m ()
playlistClear :: forall (m :: * -> *). MonadMPD m => PlaylistName -> m ()
playlistClear = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ())
-> (PlaylistName -> Command ()) -> PlaylistName -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Command ()
A.playlistClear
playlistDelete :: MonadMPD m => PlaylistName -> Position -> m ()
playlistDelete :: forall (m :: * -> *).
MonadMPD m =>
PlaylistName -> Position -> m ()
playlistDelete PlaylistName
name = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ())
-> (Position -> Command ()) -> Position -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Position -> Command ()
A.playlistDelete PlaylistName
name
playlistMove :: MonadMPD m => PlaylistName -> Id -> Position -> m ()
playlistMove :: forall (m :: * -> *).
MonadMPD m =>
PlaylistName -> Id -> Position -> m ()
playlistMove PlaylistName
name Id
from = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ())
-> (Position -> Command ()) -> Position -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Id -> Position -> Command ()
A.playlistMove PlaylistName
name Id
from
rename :: MonadMPD m
=> PlaylistName
-> PlaylistName
-> m ()
rename :: forall (m :: * -> *).
MonadMPD m =>
PlaylistName -> PlaylistName -> m ()
rename PlaylistName
plname = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ())
-> (PlaylistName -> Command ()) -> PlaylistName -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> PlaylistName -> Command ()
A.rename PlaylistName
plname
rm :: MonadMPD m => PlaylistName -> m ()
rm :: forall (m :: * -> *). MonadMPD m => PlaylistName -> m ()
rm = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ())
-> (PlaylistName -> Command ()) -> PlaylistName -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Command ()
A.rm
save :: MonadMPD m => PlaylistName -> m ()
save :: forall (m :: * -> *). MonadMPD m => PlaylistName -> m ()
save = Command () -> m ()
forall (m :: * -> *) a. MonadMPD m => Command a -> m a
A.runCommand (Command () -> m ())
-> (PlaylistName -> Command ()) -> PlaylistName -> m ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PlaylistName -> Command ()
A.save