{-
This module is private since 'Cons' shall not be public.
However, 'Cons' is not needed at all
because the plot command (here @clear@)
is determined entirely by the graph type.
-}
module Graphics.Gnuplot.Private.GraphEmpty where

import qualified Graphics.Gnuplot.Private.Graph as Graph
import qualified Graphics.Gnuplot.Private.FrameOptionSet as OptionSet


data T = Cons


instance Graph.C T where
   command :: Command T
command = String -> Command T
forall graph. String -> Command graph
Graph.Command String
"clear"
   toString :: T -> String
toString = String -> T -> String
forall a b. a -> b -> a
const String
""
   defltOptions :: T T
defltOptions =
      Plain -> T T
forall graph. Plain -> T graph
OptionSet.Cons Plain
OptionSet.deflt