module Ex where

import Prelude
import Data.Text
import Data.Interpolation
import Data.Interpolation.TH

withUninterpolated [d|
  data MyProduct = MyProduct
    { _myProductBar :: Maybe Text  --
    , myProductBaz :: Int
    , myProductData :: Double
    -- , myProductQuux :: Bool
    } deriving Eq
  |]

withUninterpolated [d|
  data MySum
    = MySumOne Text
    | MySunTwo Int
    | MySumData Bool
    deriving Eq
  |]

-- foo :: MyProduct -> Int
-- foo = myProductBaz