In order to download a given web page, I wrote the attached program. The
problem is that the page is not being full downloaded. It is being
somehow intettupted.

Any clues on how to solve this problem?

Romildo
module Main where

import Network.HTTP (getResponseBody, getRequest, simpleHTTP)

openURL x = simpleHTTP (getRequest x) >>= getResponseBody

main =
  do src <- openURL "http://www.adorocinema.com/common/search/search_by_film/?criteria=Bourne";
     writeFile "test.html" src
     putStrLn src
_______________________________________________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe

Reply via email to