{-# LANGUAGE OverloadedStrings #-}
module Network.MPD.Applicative.Connection
( password
, ping
) where
import Network.MPD.Applicative.Internal
import Network.MPD.Core
password :: Password -> Command ()
password :: Password -> Command ()
password Password
pwd = Parser () -> [Password] -> Command ()
forall a. Parser a -> [Password] -> Command a
Command Parser ()
emptyResponse [Password
"password " Password -> Password -> Password
forall a. [a] -> [a] -> [a]
++ Password
pwd]
ping :: Command ()
ping :: Command ()
ping = Parser () -> [Password] -> Command ()
forall a. Parser a -> [Password] -> Command a
Command Parser ()
emptyResponse [Password
"ping"]