您的位置:首页 > 其它

工作需要写了第一个简单的haskell程序,练手

2016-08-15 00:00 375 查看
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE RecordWildCards #-}

module Main where

import Options.Applicative
import System.Environment
import System.Exit
import System.IO
import System.Directory
import System.FilePath
import Control.Exception
import qualified Data.Map.Lazy as DM
-- import qualified Date.ByteString.Lazy as BL
import Control.Monad (mapM_)

data MyArgs = MyArgs
{ dir :: FilePath
, ref :: FilePath }

margs :: Parser MyArgs
margs = MyArgs
<$> strOption
(
long "directory"
<> short 'd'
<> metavar "DIR"
<> help "Directory that contains the downloaded files"
)
<*> strOption
(
long "reference"
<> short 'r'
<> metavar "REF"
<> help "Reference file that contains the original names and new names"
)

renameDownloads :: MyArgs -> IO ()
renameDownloads MyArgs {..} = do
putStrLn $ "Rename maps: " ++ ref
putStrLn $ "Source directory: " ++ dir
r         <- getRenameRef ref
fnames    <- getDirectoryContents dir
let rnMap = DM.fromList r
rename dir rnMap fnames
putStrLn "Finished"

rename :: FilePath -> DM.Map FilePath String -> [FilePath] -> IO ()
rename dir renameMap = mapM_ rename'
where rename' filename = case DM.lookup filename renameMap of
Nothing -> return ()
Just val -> renameFile (dir </> filename) (dir </> val)

getRenameRef :: FilePath -> IO [(FilePath, String)]
getRenameRef fpath = do
h <- openFile fpath ReadMode
hSetEncoding h utf8
contents <- hGetContents h
parse contents
where
parse = return . alist . parse'
parse' = map words . lines
alist = convert2alist . filterValidPath
filterValidPath = filter (\inp -> case inp of
(x:xs) -> True
_ -> False
)
convert2alist = map (\(x:xs) -> (x, unwords xs))

main :: IO ()
main = execParser opts >>= renameDownloads
where opts = info (helper <*> margs)
(
fullDesc
<> progDesc "Batch rename the audio files downloaded from xxxxxxx"
)

批量重命名,直接贴代码吧,写ruby的码农朋友说“这他么看也看不懂,是猴子写的吗?”

不得不说,Option.Applicative真心不错,貌似社区也是大力推荐,

没有用monad之类的,基本上就是很简单的逻辑,只是为了习惯了一下haskell的写法,连错误处理没有ADT也没有,所以,just a toy,只是为了满足需求
内容来自用户分享和网络整理,不保证内容的准确性,如有侵权内容,可联系管理员处理 点击这里给我发消息
标签:  Haskell
相关文章推荐