{-# Language NoImplicitPrelude, FlexibleContexts, OverloadedStrings, ExtendedDefaultRules #-}
module Rollbar.MonadLogger where
import BasicPrelude
import Rollbar
default (Text)
reportErrorS :: Settings
-> Options
-> Text
-> (Text -> Text -> IO ())
-> Text
-> IO ()
reportErrorS :: Settings
-> Options -> Text -> (Text -> Text -> IO ()) -> Text -> IO ()
reportErrorS = Settings
-> Options -> Text -> (Text -> Text -> IO ()) -> Text -> IO ()
forall (m :: * -> *).
(MonadIO m, MonadBaseControl IO m) =>
Settings
-> Options -> Text -> (Text -> Text -> m ()) -> Text -> m ()
reportLoggerErrorS