-- |
-- Module      :  Mcmc.Monitor.Log
-- Description :  Monitor logarithmic values
-- Copyright   :  2021 Dominik Schrempf
-- License     :  GPL-3.0-or-later
--
-- Maintainer  :  dominik.schrempf@gmail.com
-- Stability   :  unstable
-- Portability :  portable
--
-- Creation date: Fri May 29 12:30:03 2020.
module Mcmc.Monitor.Log
  ( renderLog,
  )
where

import qualified Data.ByteString.Builder as BB
import qualified Data.ByteString.Lazy.Char8 as BL
import Numeric.Log

-- | Print a log value.
renderLog :: Log Double -> BL.ByteString
renderLog :: Log Double -> ByteString
renderLog = Builder -> ByteString
BB.toLazyByteString forall b c a. (b -> c) -> (a -> b) -> a -> c
. FloatFormat -> Double -> Builder
BB.formatDouble (Int -> FloatFormat
BB.standard Int
8) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Log a -> a
ln
{-# INLINEABLE renderLog #-}