-- 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.EN.Corpus
  ( corpus
  ) where

import Data.String
import Prelude

import Duckling.Ordinal.Types
import Duckling.Testing.Types

corpus :: Corpus
corpus :: Corpus
corpus = (Context
testContext, 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
"first"
             , Text
"1st"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
2)
             [ Text
"second"
             , Text
"2nd"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
3)
             [ Text
"third"
             , Text
"3rd"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
4)
             [ Text
"fourth"
             , Text
"4th"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
8)
             [ Text
"eighth"
             , Text
"8th"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
25)
             [ Text
"twenty-fifth"
             , Text
"twenty—fifth"
             , Text
"twenty fifth"
             , Text
"twentyfifth"
             , Text
"25th"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
31)
             [ Text
"thirty-first"
             , Text
"thirty—first"
             , Text
"thirty first"
             , Text
"thirtyfirst"
             , Text
"31st"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
42)
             [ Text
"forty-second"
             , Text
"forty—second"
             , Text
"forty second"
             , Text
"fortysecond"
             , Text
"42nd"
             ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
73)
            [ Text
"seventy-third"
            , Text
"seventy—third"
            , Text
"seventy third"
            , Text
"seventythird"
            , Text
"73rd"
            ]
  , OrdinalData -> [Text] -> [Example]
forall a. ToJSON a => a -> [Text] -> [Example]
examples (Int -> OrdinalData
OrdinalData Int
90)
            [ Text
"ninetieth"
            , Text
"90th"
            ]
  ]