module Render.Utils where

import Agda.Utils.Time ( CPUTime )
import Agda.Utils.Pretty (pretty)

import Render.Class
import Render.RichText


instance Render CPUTime where
  render :: CPUTime -> Inlines
render = String -> Inlines
text forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Show a => a -> String
show forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Pretty a => a -> Doc
pretty