module Sox where

import qualified Algebra.RealField as RealField


channelOption :: Int -> [String]
channelOption n =
   ["-c", show n]
{-
   if n == 1
     then []
     else ["-c", show n]
-}

sampleRateOption :: (RealField.C a) => a -> [String]
sampleRateOption r = ["-r", show (RealField.round r :: Int)]