| Safe Haskell | None |
|---|---|
| Language | Haskell98 |
Network.Socket
Documentation
Constructors
| AF_UNSPEC | unspecified |
| AF_UNIX | local to host (pipes, portals |
| AF_INET | internetwork: UDP, TCP, etc |
| AF_INET6 | Internet Protocol version 6 |
| AF_IMPLINK | arpanet imp addresses |
| AF_PUP | pup protocols: e.g. BSP |
| AF_CHAOS | mit CHAOS protocols |
| AF_NS | XEROX NS protocols |
| AF_NBS | nbs protocols |
| AF_ECMA | european computer manufacturers |
| AF_DATAKIT | datakit protocols |
| AF_CCITT | CCITT protocols, X.25 etc |
| AF_SNA | IBM SNA |
| AF_DECnet | DECnet |
| AF_DLI | Direct data link interface |
| AF_LAT | LAT |
| AF_HYLINK | NSC Hyperchannel |
| AF_APPLETALK | Apple Talk |
| AF_ROUTE | Internal Routing Protocol |
| AF_NETBIOS | NetBios-style addresses |
| AF_NIT | Network Interface Tap |
| AF_802 | IEEE 802.2, also ISO 8802 |
| AF_ISO | ISO protocols |
| AF_OSI | umbrella of all families used by OSI |
| AF_NETMAN | DNA Network Management |
| AF_X25 | CCITT X.25 |
| AF_AX25 | |
| AF_OSINET | AFI |
| AF_GOSSIP | US Government OSI |
| AF_IPX | Novell Internet Protocol |
| Pseudo_AF_XTP | eXpress Transfer Protocol (no AF) |
| AF_CTF | Common Trace Facility |
| AF_WAN | Wide Area Network protocols |
| AF_SDL | SGI Data Link for DLPI |
| AF_NETWARE | |
| AF_NDD | |
| AF_INTF | Debugging use only |
| AF_COIP | connection-oriented IP, aka ST II |
| AF_CNT | Computer Network Technology |
| Pseudo_AF_RTIP | Help Identify RTIP packets |
| Pseudo_AF_PIP | Help Identify PIP packets |
| AF_SIP | Simple Internet Protocol |
| AF_ISDN | Integrated Services Digital Network |
| Pseudo_AF_KEY | Internal key-management function |
| AF_NATM | native ATM access |
| AF_ARP | (rev.) addr. res. prot. (RFC 826) |
| Pseudo_AF_HDRCMPLT | Used by BPF to not rewrite hdrs in iface output |
| AF_ENCAP | |
| AF_LINK | Link layer interface |
| AF_RAW | Link layer interface |
| AF_RIF | raw interface |
| AF_NETROM | Amateur radio NetROM |
| AF_BRIDGE | multiprotocol bridge |
| AF_ATMPVC | ATM PVCs |
| AF_ROSE | Amateur Radio X.25 PLP |
| AF_NETBEUI |
|
| AF_SECURITY | Security callback pseudo AF |
| AF_PACKET | Packet family |
| AF_ASH | Ash |
| AF_ECONET | Acorn Econet |
| AF_ATMSVC | ATM SVCs |
| AF_IRDA | IRDA sockets |
| AF_PPPOX | PPPoX sockets |
| AF_WANPIPE | Wanpipe API sockets |
| AF_BLUETOOTH | bluetooth sockets |
isSupportedFamily :: Family -> Bool Source #
data SocketType Source #
Instances
Constructors
| SockAddrInet PortNumber HostAddress |
isSupportedSockAddr :: SockAddr -> Bool Source #
data SocketStatus Source #
Constructors
| NotConnected | |
| Bound | |
| Listening | |
| Connected | |
| ConvertedToHandle | |
| Closed |
Instances
type HostAddress = Word32 Source #
hostAddressToTuple :: HostAddress -> (Word8, Word8, Word8, Word8) Source #
tupleToHostAddress :: (Word8, Word8, Word8, Word8) -> HostAddress Source #
type ProtocolNumber = CInt Source #
newtype PortNumber Source #
type ServiceName = String Source #
Constructors
| AddrInfo | |
Fields | |
data AddrInfoFlag Source #
Instances
data NameInfoFlag Source #
Constructors
| NI_DGRAM | |
| NI_NAMEREQD | |
| NI_NOFQDN | |
| NI_NUMERICHOST | |
| NI_NUMERICSERV |
Instances
getNameInfo :: [NameInfoFlag] -> Bool -> Bool -> SockAddr -> IO (Maybe HostName, Maybe ServiceName) Source #
socket :: Family -> SocketType -> ProtocolNumber -> IO Socket Source #
socketPair :: Family -> SocketType -> ProtocolNumber -> IO (Socket, Socket) Source #
socketPort :: Socket -> IO PortNumber Source #
data SocketOption Source #
Constructors
Instances
getSocketOption :: Socket -> SocketOption -> IO Int Source #
setSocketOption :: Socket -> SocketOption -> Int -> IO () Source #
sOL_SOCKET :: Int Source #
sCM_RIGHTS :: Int Source #
maxListenQueue :: Int Source #
withSocketsDo :: IO a -> IO a Source #