module Sound.Sox.Convert where
import qualified Sound.Sox.Private.Option as Option
import qualified Sound.Sox.Private.Arguments as Args
import Data.Monoid (mconcat, )
import qualified System.Process as Cmd
import System.Exit (ExitCode, )
simple ::
Option.T ->
FilePath ->
Option.T ->
FilePath ->
IO ExitCode
simple srcOpts srcFile dstOpts dstFile =
Cmd.rawSystem "sox"
(Args.decons $ mconcat $
Option.toArguments srcOpts :
Args.fileName srcFile :
Option.toArguments dstOpts :
Args.fileName dstFile :
[])