module PMS.Domain.Model.DM.Constant where
import qualified Data.Text as T
import qualified Data.ByteString as B
import qualified Data.Text.Encoding as T
_LOGTAG :: T.Text
_LOGTAG :: Text
_LOGTAG = String -> Text
T.pack String
""
_TIME_FORMAT :: B.ByteString
_TIME_FORMAT :: ByteString
_TIME_FORMAT = Text -> ByteString
T.encodeUtf8 (Text -> ByteString) -> Text -> ByteString
forall a b. (a -> b) -> a -> b
$ String -> Text
T.pack String
"%Y/%m/%d %T %z"
_TIMEOUT_MICROSEC :: Int
_TIMEOUT_MICROSEC :: Int
_TIMEOUT_MICROSEC = Int
30 Int -> Int -> Int
forall a. Num a => a -> a -> a
* Int
1000 Int -> Int -> Int
forall a. Num a => a -> a -> a
* Int
1000
_TOOLS_LIST_FILE :: String
_TOOLS_LIST_FILE :: String
_TOOLS_LIST_FILE = String
"tools-list.json"
_PROMPTS_LIST_FILE :: String
_PROMPTS_LIST_FILE :: String
_PROMPTS_LIST_FILE = String
"prompts-list.json"
_RESOURCES_LIST_FILE :: String
_RESOURCES_LIST_FILE :: String
_RESOURCES_LIST_FILE = String
"resources-list.json"
_RESOURCES_TPL_LIST_FILE :: String
_RESOURCES_TPL_LIST_FILE :: String
_RESOURCES_TPL_LIST_FILE = String
"resources-templates-list.json"
_LF :: String
_LF :: String
_LF = String
"\n"
_CRLF :: String
_CRLF :: String
_CRLF = String
"\r\n"
_CR :: String
_CR :: String
_CR = String
"\r"