{-# LANGUAGE OverloadedStrings #-}

-- | Server configuration.

module FP.Server.Config where

import Prelude (Integer)
import Data.Text (Text)

-- | Default url to accept commands on.
defaultUrl :: Text
defaultUrl = "https://www.fpcomplete.com/"

-- | Default port to accept commands on.
defaultPort :: Integer
defaultPort = 1990