module Language.Haskell.LSP.Types.Constants where

import           Data.Aeson.TH

-- ---------------------------------------------------------------------

-- | Standard options for use when generating JSON instances
lspOptions :: Options
lspOptions :: Options
lspOptions = Options
defaultOptions { omitNothingFields :: Bool
omitNothingFields = Bool
True, fieldLabelModifier :: String -> String
fieldLabelModifier = Int -> String -> String
forall a. Int -> [a] -> [a]
drop Int
1 }
 -- NOTE: This needs to be in a separate file because of the TH stage restriction

customModifier :: String -> String
customModifier :: String -> String
customModifier String
"_xdata" = String
"data"
customModifier String
"_xtype" = String
"type"
customModifier String
xs = Int -> String -> String
forall a. Int -> [a] -> [a]
drop Int
1 String
xs