{-# LANGUAGE KindSignatures #-} -- $foo module Boilerplate.Example where import Data.Text (Text) {- this is a block comment -} -- | BOILERPLATE This is a doc string data Coord1 = Coordy1 Double Double {- BOILERPLATE Coord1 FromJSON, ToJSON -} data Coord2 = Coordy2 { a :: Double, b :: Double} -- BOILERPLATE Coord FromJSON, ToJSON field={a:x, b:y} -- BOILERPLATE END data Union = Wales String | England Int Int | Scotland data Things a b = T a b Double data Logger (m :: * -> *) = Logger { log :: Text -> m () } data Action a = Admin [a] Text | User a Text data InfixProd = Text :| Text data InfixSum = Text :|| Text | Text :||| Text