{-# LANGUAGE OverloadedStrings #-}
module Network.MPD.Commands.Stickers
( stickerGet
, stickerSet
, stickerDelete
, stickerList
, stickerFind
) where
import qualified Network.MPD.Applicative.Internal as A
import qualified Network.MPD.Applicative.Stickers as A
import Network.MPD.Commands.Types
import Network.MPD.Core
stickerGet :: MonadMPD m => ObjectType
-> String
-> String
-> m [String]
stickerGet typ uri = A.runCommand . A.stickerGet typ uri
stickerSet :: MonadMPD m => ObjectType
-> String
-> String
-> String
-> m ()
stickerSet typ uri name = A.runCommand . A.stickerSet typ uri name
stickerDelete :: MonadMPD m => ObjectType
-> String
-> String
-> m ()
stickerDelete typ uri = A.runCommand . A.stickerDelete typ uri
stickerList :: MonadMPD m => ObjectType
-> String
-> m [(String, String)]
stickerList typ = A.runCommand . A.stickerList typ
stickerFind :: MonadMPD m => ObjectType
-> String
-> String
-> m [(String, String)]
stickerFind typ uri = A.runCommand . A.stickerFind typ uri