--------------------------------------------------------------------------------
-- Copyright © 2011 National Institute of Aerospace / Galois, Inc.
--------------------------------------------------------------------------------

-- | Pretty-print the results of a simulation.

{-# LANGUAGE Safe #-}

module Copilot.Core.Interpret.Render
  {-# DEPRECATED "This module is deprecated in Copilot 3.6." #-}
  ( renderAsTable
  , renderAsCSV
  ) where

import Copilot.Core.Interpret.RenderInternal