{-# OPTIONS_GHC -fno-warn-orphans #-}

module Text.Colour.Layout.Gen where

import Data.GenValidity
import Text.Colour.Gen ()
import Text.Colour.Layout

instance GenValid Table where
  genValid :: Gen Table
genValid = Gen Table
forall a. (Generic a, GGenValid (Rep a)) => Gen a
genValidStructurallyWithoutExtraChecking
  shrinkValid :: Table -> [Table]
shrinkValid = Table -> [Table]
forall a.
(Generic a, GValidRecursivelyShrink (Rep a),
 GValidSubterms (Rep a) a) =>
a -> [a]
shrinkValidStructurallyWithoutExtraFiltering

instance GenValid TableBackground where
  genValid :: Gen TableBackground
genValid = Gen TableBackground
forall a. (Generic a, GGenValid (Rep a)) => Gen a
genValidStructurallyWithoutExtraChecking
  shrinkValid :: TableBackground -> [TableBackground]
shrinkValid = TableBackground -> [TableBackground]
forall a.
(Generic a, GValidRecursivelyShrink (Rep a),
 GValidSubterms (Rep a) a) =>
a -> [a]
shrinkValidStructurallyWithoutExtraFiltering