Skip to content

Instantly share code, notes, and snippets.

@danbst
Last active December 20, 2015 00:49
Show Gist options
  • Star 0 You must be signed in to star a gist
  • Fork 0 You must be signed in to fork a gist
  • Save danbst/6044816 to your computer and use it in GitHub Desktop.
Save danbst/6044816 to your computer and use it in GitHub Desktop.
download file with http-streams and io-streams (with progressbar)
{-# LANGUAGE OverloadedStrings, ScopedTypeVariables #-}
import qualified Data.ByteString as BS
import qualified Data.ByteString.Char8 as C8
import qualified System.IO.Streams.Combinators as SC
import Network.Socket (withSocketsDo)
import System.IO.Streams (InputStream, OutputStream, ReadTooShortException)
import Network.Http.Client
import qualified System.IO.Streams as S
import Data.Maybe
import Control.Exception (bracket)
import qualified System.IO as IO
displayProgress :: Int -> OutputStream BS.ByteString -> IO (OutputStream BS.ByteString)
displayProgress totalLength outStream =
fmap fst $ SC.outputFoldM acc 0 outStream
where
acc :: Int -> BS.ByteString -> IO Int
acc last bs = do
let progress = last + BS.length bs
putStr $ "\r[" ++ progressbar progress 70 ++ "]"
return progress
progressbar prog len = map outchar [1..len]
where cur = floor $ fromIntegral len * (fromIntegral prog / fromIntegral totalLength)
outchar n | n > cur = ' '
| n == cur = '>'
| n < cur = '='
downloadFile url name = withSocketsDo $ get url $ \response inStream -> do
let l = fromIntegral $ fst $ fromJust $ C8.readInteger $ fromJust $ getHeader response "Content-Length"
bracket (IO.openBinaryFile name IO.WriteMode)
(IO.hClose)
(\h -> S.handleToOutputStream h >>= displayProgress l >>= S.connect inStream)
main :: IO ()
main = do
let url = "http://audacity.googlecode.com/files/audacity-macosx-ub-2.0.3.dmg"
print $ "Downloading " ++ url
downloadFile (C8.pack url) "10MB2.zip"
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment