I have 2 questions. First is on the Socket module - I have a program (server)
which looks like:

"module Main where

import Socket

main = do
        socket <- listenOn (PortNumber (mkPortNumber 6665))
        (handle, hn) <- accept socket
        putStrLn hn" - it's just supposed to say who called and exit.
Nevertheless, when I try to run it again, it says:

"Fail: resource busy
Action: bindSocket
Reason: Address already in use".

I understand it can be something which is caused by the nature of
sockets themselves, however I find no mechanism in Socket library to get rid
of (socket|port) (unbind it).

The second question - does anybody know about a GHC/Haskell library with
graphs implementation?

Khaliff TM                                   [EMAIL PROTECTED]
                                             http://www2.ids.pl/~khaliff

"The show must go on."

Reply via email to