-- Copyright (c) 2016-present, Facebook, Inc.
-- All rights reserved.
--
-- This source code is licensed under the BSD-style license found in the
-- LICENSE file in the root directory of this source tree.


{-# LANGUAGE OverloadedStrings #-}

module Duckling.Ordinal.RU.Corpus
  ( corpus ) where

import Prelude
import Data.String

import Duckling.Locale
import Duckling.Ordinal.Types
import Duckling.Resolve
import Duckling.Testing.Types

corpus :: Corpus
corpus :: Corpus
corpus = (Context
testContext {locale :: Locale
locale = Lang -> Maybe Region -> Locale
makeLocale Lang
RU Maybe Region
forall a. Maybe a
Nothing}, Options
testOptions, [Example]
allExamples)

allExamples :: [Example]
allExamples :: [Example]
allExamples = [[Example]] -> [Example]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat
  [ OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
1)
             [ Text
"первый"
             , Text
"Первая"
             , Text
"первая"
             , Text
"первое"
             , Text
"первой"
             , Text
"первого"
             , Text
"1ая"
             , Text
"1-ая"
             , Text
"1ый"
             , Text
"1-ый"
             , Text
"1ое"
             , Text
"1-ое"
             , Text
"1й"
             , Text
"1-й"
             , Text
"1го"
             , Text
"1-го"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
3)
             [ Text
"третий"
             , Text
"третья"
             , Text
"третье"
             , Text
"третьей"
             , Text
"третьего"
             , Text
"3й"
             , Text
"3ий"
             , Text
"3я"
             , Text
"3ья"
             , Text
"3е"
             , Text
"3ье"
             , Text
"3го"
             , Text
"3-й"
             , Text
"3-ий"
             , Text
"3-я"
             , Text
"3-ья"
             , Text
"3-е"
             , Text
"3-ье"
             , Text
"3-го"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
4)
             [ Text
"четвертый"
             , Text
"четвертая"
             , Text
"четвертое"
             , Text
"четвертой"
             , Text
"четвертого"
             , Text
"4й"
             , Text
"4ый"
             , Text
"4ая"
             , Text
"4ое"
             , Text
"4ой"
             , Text
"4го"
             , Text
"4-й"
             , Text
"4-ый"
             , Text
"4-ая"
             , Text
"4-ое"
             , Text
"4-ой"
             , Text
"4-го"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
15)
             [ Text
"пятнадцатый"
             , Text
"15й"
             , Text
"15-й"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
21)
             [ Text
"21й"
             , Text
"21-й"
             , Text
"21-го"
             , Text
"Двадцать первый"
             , Text
"двадцать первый"
             , Text
"двадцать первого"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
23)
             [ Text
"23й"
             , Text
"23-й"
             , Text
"двадцать третий"
             , Text
"двадцать третьего"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
31)
             [ Text
"31ый"
             , Text
"31-ый"
             , Text
"тридцать первый"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
48)
             [ Text
"48ое"
             , Text
"48-ое"
             , Text
"сорок восьмое"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
99)
             [ Text
"99ый"
             , Text
"99-й"
             , Text
"девяносто девятый"
             ]
  ]