nagios-check: Package for writing monitoring plugins

[ library, metrics, mit, monitoring, system ] [ Propose Tags ]

Implements Nagios plugin development guidelines within a Haskell framework for writing Nagios checks.


[Skip to Readme]

Modules

[Index]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.1.0.0, 0.2.0, 0.2.1, 0.3.0, 0.3.1, 0.3.2
Change log CHANGELOG.md
Dependencies base (>=4.5 && <5), bifunctors, exceptions, mtl, text [details]
License MIT
Copyright 2014-2015 Sharif Olorin
Author Sharif Olorin
Maintainer sio@tesser.org
Category System , Monitoring , Metrics
Home page https://github.com/olorin/haskell-nagios-check
Source repo head: git clone git@github.com:olorin/haskell-nagios-check.git
Uploaded by fractalcat at 2015-09-01T18:27:17Z
Distributions LTSHaskell:0.3.2, NixOS:0.3.2, Stackage:0.3.2
Reverse Dependencies 2 direct, 0 indirect [details]
Downloads 4827 total (22 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2015-09-01 [all 1 reports]

Readme for nagios-check-0.3.2

[back to package description]

Build Status

nagios-check

Write Nagios (or Icinga, Shinken, et cetera) plugins in Haskell.

Documentation

On Hackage.

Example usage

{-# LANGUAGE OverloadedStrings #-}

import System.Nagios.Plugin

universeCheck :: Double -> NagiosPlugin ()
universeCheck pi' = do
    addResult OK "universe passes basic consistency tests"
    if (pi' < (3.0 :: Double)) then addResult Critical "universe broken, π < 3" else return ()

main :: IO ()
main = runNagiosPlugin (universeCheck 3.1415)

Dependencies

nagios-check has been tested with GHC 7.8 and 7.10.