Metadata revisions for prometheus-0.1.1

Package maintainers and Hackage trustees are allowed to edit certain bits of package metadata after a release, without uploading a new tarball. Note that the tarball itself is never changed, just the metadata that is stored separately. For more information about metadata revisions, please refer to the Hackage Metadata Revisions FAQ.

No. Time User SHA256
-r2 (prometheus-0.1.1-r2) 2019-02-06T12:29:59Z HerbertValerioRiedel 5838421411ef465a3644e9278a43a5e76be1ea13a086ee06c6398484b4cad0eb
  • Changed the library component's library dependency on 'base' from

    >=4.7 && <5.0
    to
    >=4.8 && <5

-r1 (prometheus-0.1.1-r1) 2016-03-18T01:50:41Z LukeHoersten 68587df8835a894134e468240589efe668b14b60135f1333565769dba7effc15
  • Changed description from

    [Prometheus Haskell Client]
    
    A simple and modern, type safe, idiomatic Haskell client for
    <http://prometheus.io Prometheus> monitoring. Specifically there is no
    use of unsafe IO or manual ByteString construction from lists of
    bytes. Batteries-included web server.
    
    [Usage Example]
    
    > {-# LANGUAGE OverloadedStrings #-}
    >
    > module Example where
    >
    > import           System.Metrics.Prometheus.GlobalRegistry
    > import           System.Metrics.Prometheus.Http
    > import           System.Metrics.Prometheus.Metric.Counter (inc)
    > import           System.Metrics.Prometheus.MetricId
    >
    >
    > main :: IO ()
    > main = do
    >     globalRegistry <- new
    >
    >     -- Labels can be defined as lists or added to an empty label set
    >     connectSuccessGauge <- registerGauge "example_connections" (fromList [("login", "success")]) globalRegistry
    >     connectFailureGauge <- registerGauge "example_connections" (addLabel "login" "failure" mempty) globalRegistry
    >     connectCounter <- registerCounter "example_connection_total" mempty globalRegistry
    >     latencyHistogram <- registerHistogram "example_round_trip_latency_ms" mempty [10, 20..100] globalRegistry
    >
    >     inc connectCounter -- increment a counter
    >
    >     -- [...] pass metric handles to the rest of the app
    >
    >     serveHttpTextMetrics 8080 globalRegistry -- http://localhost:8080/metric server
    >
    
    [Advanced Usage]
    
    A `Registry` and `StateT`-based `RegistryT` are available for unit testing or generating lists
    of `[IO a]` actions that can be `sequenced` and returned from pure code to be applied.
    to
    [Prometheus Haskell Client]
    
    A simple and modern, type safe, idiomatic Haskell client for
    <http://prometheus.io Prometheus> monitoring. Specifically there is no
    use of unsafe IO or manual ByteString construction from lists of
    bytes. Batteries-included web server.
    
    [Usage Example]
    
    > module Example where
    >
    > import           System.Metrics.Prometheus.GlobalRegistry
    > import           System.Metrics.Prometheus.Http
    > import           System.Metrics.Prometheus.Metric.Counter (inc)
    > import           System.Metrics.Prometheus.MetricId
    >
    >
    > main :: IO ()
    > main = do
    >     globalRegistry <- new
    >
    >     -- Labels can be defined as lists or added to an empty label set
    >     connectSuccessGauge <- registerGauge "example_connections" (fromList [("login", "success")]) globalRegistry
    >     connectFailureGauge <- registerGauge "example_connections" (addLabel "login" "failure" mempty) globalRegistry
    >     connectCounter <- registerCounter "example_connection_total" mempty globalRegistry
    >     latencyHistogram <- registerHistogram "example_round_trip_latency_ms" mempty [10, 20..100] globalRegistry
    >
    >     inc connectCounter -- increment a counter
    >
    >     -- [...] pass metric handles to the rest of the app
    >
    >     serveHttpTextMetrics 8080 globalRegistry -- http://localhost:8080/metric server
    >
    
    [Advanced Usage]
    
    A `Registry` and `StateT`-based `RegistryT` are available for unit testing or generating lists
    of `[IO a]` actions that can be `sequenced` and returned from pure code to be applied.

-r0 (prometheus-0.1.1-r0) 2016-03-18T01:45:28Z LukeHoersten ef3e3e2ba98d66209b0f6935490b25adbb37f124a904a2866b32dad45a8eee8c