module Hix.Managed.Handlers.Report where

import Hix.Data.Monad (M)
import Hix.Managed.Data.ProjectResult (ProjectResult)

data ReportHandlers =
  ReportHandlers {
    ReportHandlers -> ProjectResult -> M ()
mutations :: ProjectResult -> M ()
  }

handlersNull :: ReportHandlers
handlersNull :: ReportHandlers
handlersNull =
  ReportHandlers {mutations :: ProjectResult -> M ()
mutations = \ ProjectResult
_ -> M ()
forall (f :: * -> *). Applicative f => f ()
unit}