Win32-dhcp-server: Win32 DHCP Server Management API.

[ bsd3, library, system ] [ Propose Tags ]
This version is deprecated.

This package provides a partial binding to the Win32 DHCP Server Management API. Its purpose is to query and control a Microsoft DHCP server. Enough functionality is defined so so that Ipv4 client lease and reservation records can be manipulated programmatically.

Here are a few notes on the required environment:

  • Only 32-bit executables are supported. This is mainly because pointers are assumed to be 4 bytes wide in a few places. Support for 64-bit executables may be added in the future.

  • All library calls should be supported on Windows 7 or above.

Simple Example and Usage

-- Print all MAC addresses with an active client lease
module Main where

import Data.Ip
import Data.Mac
import qualified Data.Text.IO as T
import System.Win32.DHCP

main :: IO ()
main = do
    api <- loadDHCP
    clients <- enumClients api context
    let macs = map (showMac ":" . clientHardwareAddress) clients
    mapM_ T.putStrLn macs
  where
    Right subnet = readIp "192.168.1.0"
    context = Context "192.168.1.5" subnet

Modules

[Index]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.1, 0.2, 0.2.1, 0.3, 0.3.1, 0.3.2 (info)
Change log ChangeLog
Dependencies base (>=4.6 && <4.8), text (>0.11 && <1.2), Win32, Win32-errors (>=0.2 && <1.0) [details]
License BSD-3-Clause
Copyright 2013 Michael Steele
Author Michael Steele
Maintainer mikesteele81@gmail.com
Category System
Home page http://github.com/mikesteele81/win32-dhcp-server
Bug tracker http://github.com/mikesteele81/win32-dhcp-server/issues
Uploaded by MichaelSteele at 2014-04-05T16:55:35Z
Distributions NixOS:0.3.2
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 4395 total (9 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs uploaded by user
Build status unknown [no reports yet]