Search results

Jump to navigation Jump to search

Page title matches

  • #redirect [[Introduction to Haskell IO/Actions]]
    83 bytes (11 words) - 06:49, 8 June 2023
  • ...это обычная функция, тип результата которой обёрнут в конструктор типов '''IO'''. putChar :: Char -> IO () -- выводит один символ на stdout
    25 KB (918 words) - 06:01, 1 June 2022
  • ...Haskellers - if that's you, a good place to start is the [[Introduction to IO]] which can help you learn the basics (e.g. the syntax of I/O expressions) data IO a = Act (Time -> (a, Time))
    82 KB (13,140 words) - 09:07, 3 May 2024
  • The implementation of IO as a monad is the main reason you need to be comfortable with monads to be <code>IO</code> is the monad you cannot avoid.
    6 KB (940 words) - 12:17, 19 April 2024
  • ...//hackage.haskell.org/package/base-4.6.0.1/docs/System-IO.html#g:21 System.IO] ...rovides byte level operations, and is used in some applications for binary IO
    2 KB (254 words) - 19:03, 23 October 2013
  • ...e are only some of the various ways to describe the semantics of </i><code>IO a</code><i>; your actual implementation may vary. (Inspired by [https://lukepalmer.wordpress.com/2008/03/29/io-monad-the-continuation-presentation Luke Palmer's post].)
    11 KB (1,628 words) - 10:36, 5 April 2024
  • It may be possible to use a simpler, more specific type than <code>IO</code> for certain tasks. randomDist :: (Random a, Num a) => (a -> a) -> IO a
    10 KB (1,634 words) - 22:52, 6 April 2022
  • 56 bytes (7 words) - 12:02, 19 April 2024
  • 61 bytes (9 words) - 06:54, 8 June 2023
  • Operatiile de IO sunt in Haskell numite actiuni si sunt de fapt niste date. Le puteti pune p
    733 bytes (114 words) - 15:19, 6 February 2021
  • The one chosen for Haskell is to keep the I/O of an ''action'' (<code>IO</code> computation) outside of Haskell's expression evaluation by moving it This is where the <code>IO</code> types come into play.
    8 KB (1,215 words) - 07:10, 12 June 2023
  • ...based on the ideas found in Plan 9 and Inferno, that is, to represent each IO capable resource as a virtual file server exposing a tree of files and dire Source code: http://code.google.com/p/hs-ogl-misc/source/browse/ under the io-layer directory.
    11 KB (1,853 words) - 02:34, 26 April 2021
  • ''(This page is intended as a quick introduction to how IO is treated in Haskell. It doesn't describe everything there is to know, but particular type. Specifically, a value of type <code>(IO a)</code> is an action,
    5 KB (958 words) - 15:20, 3 August 2022
  • ...реализации Haskell I/O и постепенно сделать из вас специалиста по работе с IO. Более того, я добавил детальное описание
    64 KB (6,046 words) - 11:23, 22 October 2022
  • #redirect [[IO in action]]
    60 bytes (9 words) - 21:27, 14 June 2022
  • ...g for operations (actions) that interact with the outside world. The <code>IO</code> type is abstract: no constructors are visible to the user. [...] data IO -- abstract
    4 KB (674 words) - 07:12, 12 June 2023
  • ...20210429180440/www.microsoft.com/en-us/research/wp-content/uploads/1995/01/io-tutorial.pdf paper], [https://www.haskell.org/haskell-workshop/1995/HW1995- ...8: Input/Output] (translations: [https://www.sampou.org/haskell/tutorial-j/io.html jp])
    8 KB (1,101 words) - 10:59, 2 May 2024
  • == IO == ...t.com:80/2007/02/more-on-haskell-io-and-interact.html Introductory console IO in Haskell]
    2 KB (236 words) - 07:29, 10 August 2023
  • #redirect [[Introduction to Haskell IO/Actions]]
    83 bytes (11 words) - 06:50, 8 June 2023
  • ...rammer who has some haskell under his belt but is not yet comfortable with IO or monads. The goal is to get the reader proficient in writing useful code # [[Introduction to Haskell IO/General introduction]]
    10 KB (1,520 words) - 07:20, 10 November 2020
  • #redirect [[Tutorials/Programming Haskell/String IO]]
    88 bytes (11 words) - 12:34, 8 June 2023
  • of actions but we'll start with a very important one called an '''IO''' action. Here are some examples of IO actions:
    14 KB (2,254 words) - 20:41, 10 November 2020
  • main :: IO () ...tp://haskell.org/ghc/docs/latest/html/libraries/base/System-IO.html System.IO] library.
    19 KB (3,139 words) - 04:08, 22 October 2021
  • main :: IO () processIt :: String -> IO ()
    20 KB (3,555 words) - 06:05, 24 April 2024
  • ...mething of type <code>a</code>, so how do I get rid of that annoying <code>IO</code> type?</i> ...so in other words, you've got e.g. <code>thatIOThingie :: IO Datum</code>, but <code>regularThingie :: Datum</code> is what the rest of
    4 KB (726 words) - 05:08, 6 April 2022
  • sequence_ :: [ IO() ] -> IO () ...actiuni de IO. Valoarea initiala pentru foldr este bineinteles actiunea de IO vida: ''return ()''
    1 KB (206 words) - 15:17, 6 February 2021
  • ...te motive. Actiunile de IO sunt mult mai flexibile decat instructiunile de IO. Intr-un limbaj de programare obisnuit, de acum doua trei decenii, compilat todolist ::[ IO () ]
    2 KB (255 words) - 15:18, 6 February 2021

Page text matches

  • ...、副作用は特定の型の値としてエンコードすることで考慮されなければならない、とすることで副作用がある処理と純粋な関数を切り離してきました。<code>(IO a)</code>型の値はアクションです。これは実行されたら<co
    7 KB (299 words) - 11:39, 22 October 2022
  • throwChecked :: e -> IO a rethrowUnchecked :: forall e a. (Throws e => IO a) -> (Exception e => IO a)
    1 KB (215 words) - 10:06, 3 August 2015
  • Haskellが扱う他の値と同様に、アクションにも型があります。多くの種類のアクションがありますが、ここでは '''IO''' アクションと呼ばれる非常に重要なアクションから始 このアクションはプログラムの外部に対して働きかけることができるアクションです。ここにIOアクションの例を示します:
    18 KB (640 words) - 03:11, 9 April 2021
  • ==IO== I/O operations should be split into two parts, binary io and string io.
    2 KB (307 words) - 13:45, 23 May 2021
  • * <hask>unsafePerformIO :: IO a -> a</hask> * <hask>unsafeInterleaveIO :: IO a -> IO a</hask>
    1 KB (206 words) - 12:27, 8 June 2023
  • == IO == ...t.com:80/2007/02/more-on-haskell-io-and-interact.html Introductory console IO in Haskell]
    2 KB (236 words) - 07:29, 10 August 2023
  • MList is a monadic-list, aiming to be an alternative to [[Lazy IO|lazy I/O]]. ...s a list of a's whose evaluation continually requires executing actions in IO.
    427 bytes (73 words) - 12:02, 19 April 2024
  • import System.IO (isEOF) loop :: Producer String IO ()
    2 KB (215 words) - 09:14, 19 June 2015
  • sequence_ :: [ IO() ] -> IO () ...actiuni de IO. Valoarea initiala pentru foldr este bineinteles actiunea de IO vida: ''return ()''
    1 KB (206 words) - 15:17, 6 February 2021
  • #redirect [[IO in action]]
    60 bytes (9 words) - 21:27, 14 June 2022
  • #redirect [[Tutorials/Programming Haskell/String IO]]
    88 bytes (11 words) - 12:34, 8 June 2023
  • rnd_permu :: [a] -> IO [a] rnd_permu :: [a] -> IO [a]
    1 KB (187 words) - 13:08, 10 May 2014
  • -> IO () -> IO ()
    2 KB (363 words) - 08:15, 23 May 2021
  • #redirect [[Introduction to Haskell IO]]
    75 bytes (10 words) - 06:44, 8 June 2023
  • #redirect [[Introduction to Haskell IO/Actions]]
    83 bytes (11 words) - 06:44, 8 June 2023
  • #redirect [[Introduction to Haskell IO/Actions]]
    83 bytes (11 words) - 06:50, 8 June 2023
  • #redirect [[Introduction to Haskell IO/Actions]]
    83 bytes (11 words) - 06:49, 8 June 2023
  • ...ine ca functie pentru citit un String. getLine chiar are tipul: getLine:: IO String. Adica este o actiune de IO care poate fi folosita pentru a lega o variabila la Stringul citit.
    3 KB (436 words) - 10:21, 29 November 2019
  • * STM and IO ** [http://mult.ifario.us/articles/2007/03/04/stm-and-io STM, IO, and a Simple Persistence Model]
    3 KB (296 words) - 15:06, 25 June 2017
  • getProcessGroupID :: IO ProcessGroupID getProcessGroupIDOf :: ProcessID -> IO ProcessGroupID
    2 KB (359 words) - 00:16, 17 June 2021
  • diff_select :: Int -> Int -> IO [Int] diffSelect :: Int -> Int -> IO [Int]
    2 KB (244 words) - 00:09, 7 April 2019
  • ...mething of type <code>a</code>, so how do I get rid of that annoying <code>IO</code> type?</i> ...so in other words, you've got e.g. <code>thatIOThingie :: IO Datum</code>, but <code>regularThingie :: Datum</code> is what the rest of
    4 KB (726 words) - 05:08, 6 April 2022
  • load :: Session -> LoadHowMuch -> IO SuccessFlag compileToBytecode :: Session -> ModSummary -> IO SuccessFlag
    3 KB (404 words) - 23:03, 11 July 2021
  • ...te motive. Actiunile de IO sunt mult mai flexibile decat instructiunile de IO. Intr-un limbaj de programare obisnuit, de acum doua trei decenii, compilat todolist ::[ IO () ]
    2 KB (255 words) - 15:18, 6 February 2021
  • provides a drop-in replacement for System.IO If we use a function from System.IO.UTF8, we should also hide the equivalent one from the Prelude. (Alternative
    922 bytes (129 words) - 15:20, 6 February 2021
  • ...Left Catch''' &mdash; this is rarely advocated, but <tt>Maybe</tt> and <tt>IO</tt> satisfy this as an alternative to '''Left Distribution'''. * <hask>Maybe</hask>, <hask>IO</hask> and <hask>STM</hask> satisfy '''Monoid''', '''Left Zero''', and '''L
    2 KB (240 words) - 22:55, 5 April 2021
  • > randomRIO is IO a while the function defined by me is Int. Since I only need > randomRIO :: forall a. (Random a) => (a, a) -> IO a
    5 KB (787 words) - 11:02, 26 December 2017
  • Think about code in IO that needs to be able to break out of a loop: ...k" is to implement the <hask>Maybe</hask> monad again, this time, on <hask>IO (Maybe a)</hask> values instead of <hask>Maybe a</hask> values:
    5 KB (801 words) - 19:04, 8 February 2014
  • RWST on IO example. Inspired by [[Simple_StateT_use]].<br\> IO: Get next guess from stdin.<br\>
    2 KB (237 words) - 19:47, 9 January 2018
  • ''(This page is intended as a quick introduction to how IO is treated in Haskell. It doesn't describe everything there is to know, but particular type. Specifically, a value of type <code>(IO a)</code> is an action,
    5 KB (958 words) - 15:20, 3 August 2022
  • type Source = (,) (IO () -> IO ()) `O` IO type UI = (->) Win `O` IO `O` (,) Layout `O` Source
    3 KB (486 words) - 21:52, 29 June 2021
  • rnd_select :: [a] -> Int -> IO [a] rnd_selectIO :: [a] -> Int -> IO [a]
    4 KB (666 words) - 13:03, 10 May 2014
  • reactimate :: IO a -- init -> (Bool -> IO (DTime, Maybe a)) -- input/sense
    5 KB (780 words) - 11:40, 6 June 2016
  • The one chosen for Haskell is to keep the I/O of an ''action'' (<code>IO</code> computation) outside of Haskell's expression evaluation by moving it This is where the <code>IO</code> types come into play.
    8 KB (1,215 words) - 07:10, 12 June 2023
  • * [[Pure]] parallelism, which can be used to speed up non-IO parts of the program. * [[Concurrency]], which can be used for parallelising IO.
    3 KB (408 words) - 21:38, 3 May 2024
  • ==. Monada de IO == "The Haskell Programmer's Guide to the IO Monad" de Stefan Klinger.
    2 KB (349 words) - 05:56, 1 June 2022
  • ...20210429180440/www.microsoft.com/en-us/research/wp-content/uploads/1995/01/io-tutorial.pdf paper], [https://www.haskell.org/haskell-workshop/1995/HW1995- ...8: Input/Output] (translations: [https://www.sampou.org/haskell/tutorial-j/io.html jp])
    8 KB (1,101 words) - 10:59, 2 May 2024
  • ...xception (including 'error') to be thrown from pure code and caught in the IO monad. catch :: IO a -> (Exception -> IO a) -> IO a
    8 KB (1,141 words) - 01:44, 14 July 2021
  • main :: IO () getSeed :: [String] -> IO Int
    5 KB (787 words) - 15:17, 6 February 2021
  • main :: IO () main :: IO ()
    980 bytes (157 words) - 15:19, 6 February 2021
  • ...ask><br /><hask>mainStereo :: ((CFloat, CFloat) -> IO (CFloat, CFloat)) -> IO ()</hask>, <br /><hask>StorableArray</hask>
    3 KB (353 words) - 23:01, 29 April 2014
  • ...g for operations (actions) that interact with the outside world. The <code>IO</code> type is abstract: no constructors are visible to the user. [...] data IO -- abstract
    4 KB (674 words) - 07:12, 12 June 2023
  • ...www.haskell.org/pipermail/haskell-cafe/2010-February/072838.html safe lazy IO or Iteratee?] ...ww.mail-archive.com/haskell-cafe@haskell.org/msg45890.html Lazy vs correct IO]
    2 KB (228 words) - 15:18, 6 February 2021
  • ...//hackage.haskell.org/package/base-4.6.0.1/docs/System-IO.html#g:21 System.IO] ...rovides byte level operations, and is used in some applications for binary IO
    2 KB (254 words) - 19:03, 23 October 2013
  • of actions but we'll start with a very important one called an '''IO''' action. Here are some examples of IO actions:
    14 KB (2,254 words) - 20:41, 10 November 2020
  • main :: IO ()
    148 bytes (19 words) - 15:17, 6 February 2021
  • import Data.Array.IO shuffle :: [a] -> IO [a]
    5 KB (743 words) - 13:10, 9 May 2017
  • * <code>closeIORef :: IORef a -> IO ()</code> * <code>endMVar :: MVar a -> IO ()</code>
    3 KB (431 words) - 04:31, 9 June 2022
  • main :: IO()
    466 bytes (55 words) - 15:18, 6 February 2021
  • * [[/IO|IO in Haskell]]
    2 KB (225 words) - 11:34, 27 February 2019
  • preInTree po@(x:xs) io = do (lio,_:rio) <- return $ break (== x) io
    2 KB (280 words) - 03:43, 10 January 2017
  • ...rarely but can happen and can be handled if needs be. Typically caused by IO going wrong in some way, like the machine running out of swap and your prog * <hask>try :: Exception e => IO a -> IO (Either e a) </hask>
    5 KB (795 words) - 08:03, 3 August 2017
  • type BF a b = StateT (Ptr a) IO b tape <- (mallocBytes 10000 :: IO (Ptr Word8))
    2 KB (242 words) - 01:12, 26 April 2021
  • main :: IO ()
    546 bytes (69 words) - 15:19, 6 February 2021
  • main :: IO () oneSelection :: ListStore String -> Model.TreeSelection -> IO ()
    2 KB (280 words) - 00:46, 9 April 2021
  • primitive newIORef :: monomo a . a -> IO (IORef a) :import Prelude(Bool, Char, Double, Either, Float, Int, IO, Integer)
    3 KB (459 words) - 08:33, 18 August 2021
  • main :: IO () rows <- query_ conn "SELECT * from t1" :: IO [(Int, String, Maybe Double, Maybe UTCTime)]
    2 KB (254 words) - 09:57, 29 March 2022
  • ...the file "hi.txt", but it can easily be modified to interact with standard IO or read a file passed on the command line. The most interesting part is th import System.IO
    2 KB (238 words) - 15:18, 6 February 2021
  • ...th table; most of the complexity here comes from the string conversion and IO. The approach used here accepts a Boolean function <tt>(Bool -> Bool -> Boo table :: (Bool -> Bool -> Bool) -> IO ()
    4 KB (655 words) - 07:48, 27 April 2016
  • === <code>IO</code>, in particular === ...according to the implementation's private definition of the abstract <code>IO</code> type.
    6 KB (988 words) - 04:35, 16 March 2021
  • ...tisfy '''Left Distribution''', while others such as <tt>Maybe</tt> and <tt>IO</tt> satisfy '''Left Catch'''. ...uestion the claim that Maybe and IO should be thought of as "left catch". IO is not even in MonadPlus, and I don't see how it can be meaningfully in any
    4 KB (609 words) - 18:22, 23 June 2015
  • ...ole tcgetattr / tcsetattr thing, but let's just turn ICANON on and off, so IO.getChar doesn't wait for a newline: foreign import ccall "set_icanon" set_icanon :: CInt -> IO ()
    2 KB (331 words) - 12:45, 17 February 2015
  • myforever :: [[IO ()]] -> [[IO ()]] <br> myrepeat :: Int -> IO a -> IO () <br>
    3 KB (436 words) - 15:16, 6 February 2021
  • ...rammer who has some haskell under his belt but is not yet comfortable with IO or monads. The goal is to get the reader proficient in writing useful code # [[Introduction to Haskell IO/General introduction]]
    10 KB (1,520 words) - 07:20, 10 November 2020
  • main :: IO ()
    536 bytes (86 words) - 15:18, 6 February 2021
  • === Lists and IO === *''Execute a list of IO actions.''
    6 KB (1,106 words) - 12:32, 15 November 2019
  • ...e are only some of the various ways to describe the semantics of </i><code>IO a</code><i>; your actual implementation may vary. (Inspired by [https://lukepalmer.wordpress.com/2008/03/29/io-monad-the-continuation-presentation Luke Palmer's post].)
    11 KB (1,628 words) - 10:36, 5 April 2024
  • count :: Description -> IO (Maybe Int) openFile :: FilePath -> IO Handle
    5 KB (765 words) - 22:40, 23 April 2021
  • | IO type + monads
    732 bytes (96 words) - 21:43, 3 May 2024
  • Unfortunately Haskell's standard library names common exceptions of IO actions <hask>IOError</hask> Since no IO functions are involved, we still cannot handle exceptional situations induc
    10 KB (1,404 words) - 06:22, 22 January 2020
  • Iteratee I/O is a way to avoid the problems that can occur with [[Lazy IO|lazy I/O]]. They work by making the I/O operations explicit, making their b As a beginner, you probably used Haskell's lazy I/O through the <code>System.IO</code> module. However, while it is good enough for simple programs, its un
    4 KB (653 words) - 12:02, 19 April 2024
  • main :: IO () checkN :: Int -> IO ()
    2 KB (298 words) - 03:42, 14 August 2021
  • getParams :: IO (Int, Int, Complex Double) main :: IO ()
    4 KB (555 words) - 10:58, 22 June 2021
  • ...e entire list being operated on (forcing it all into memory at once). And IO [a] cannot lazily return any initial values. unpick :: [a] -> IO [a]
    6 KB (855 words) - 12:54, 26 June 2017
  • print :: a -> IO () print' :: flag -> a -> IO ()
    10 KB (1,575 words) - 13:27, 14 January 2015
  • The implementation of IO as a monad is the main reason you need to be comfortable with monads to be <code>IO</code> is the monad you cannot avoid.
    6 KB (940 words) - 12:17, 19 April 2024
  • Operatiile de IO sunt in Haskell numite actiuni si sunt de fapt niste date. Le puteti pune p
    733 bytes (114 words) - 15:19, 6 February 2021
  • io s n t = printf "%s of depth %d\t check: %d\n" s n t io "stretch tree" stretchN c
    6 KB (1,055 words) - 23:27, 18 April 2020
  • import System.IO... import IO...
    3 KB (397 words) - 22:15, 18 April 2021
  • * about ensuring that <code>IO</code>-based code which is inferred safe cannot perform arbitrary I/O. ...Safe Haskell infers that untrusted code inferred safe and ''not'' in <code>IO</code> can be run without fear (aside from fear of resource over-utilizatio
    3 KB (471 words) - 03:00, 5 August 2021
  • type MyForm a = XHtmlForm IO a handleDate :: ServerPartT IO Response
    8 KB (985 words) - 06:56, 16 September 2013
  • ...merely produces that original argument. <code>(>>=)</code> arranges <code>IO</code> monadic structures sequentially, starting with the leftmost innermos
    4 KB (668 words) - 08:53, 21 September 2021
  • ...nC1Ebb" kapplication_KApplication :: (Ptr KApplication) -> CInt -> CInt -> IO () qwidgets :: (Show a, QWidgetList a) => a -> IO ()
    15 KB (2,199 words) - 00:32, 23 May 2017
  • ...well, apart from the current Haskell standard defining the way IO is done in terms of Monads: [http://donsbot.wordpress.com/2009/01/31/revivi ...s the IO monad impure. But that's not a general property of monads - just IO. And even then, we can pretend that Haskell is a purely functional descript
    6 KB (1,032 words) - 16:45, 2 December 2020
  • * <code>IO a</code>, the type of I/O actions; .../O from an arbitrary function, unless that function is itself in the <code>IO</code> monad and called at some point, directly or indirectly, from <code>M
    3 KB (428 words) - 04:08, 12 April 2024
  • main :: IO () ...e setup the Behaviors and Events we need for the game. We can also do some IO in this monad. For that we simply use the <hask>liftIO</hask> function. So
    12 KB (1,907 words) - 21:33, 19 September 2015
  • instance MonadCGI (ReaderT Connection (CGIT IO)) where main :: IO ()
    4 KB (592 words) - 21:17, 29 June 2021
  • ...r possibly make your own monadic type that is a restricted subset of <code>IO</code>). But it's a lot more complicated than that... The evaluator is essentially a function, <hask>eval :: String -> IO String</hask>, which takes a random Haskell string, verifies it, compiles i
    5 KB (830 words) - 12:41, 22 June 2021
  • * Exception usually refers to an exception which is thrown in the IO monad. It can also refer to the actual typeclass "Exception" which was intr * IO exceptions. But they force your code into your IO monad, plus it's non-obvious that a function might fail with an exception b
    6 KB (961 words) - 12:45, 12 August 2019
  • Consider an extended IO monad which handles automated closing of allocated resources. liftToCleanup :: IO a -> CleanIO a
    8 KB (1,326 words) - 08:20, 31 March 2022
  • testComp1 :: ContT () IO () txt <- io getLine
    12 KB (2,067 words) - 05:43, 9 March 2021
  • ...eading the real world [https://nssdc.gsfc.nasa.gov/image/planetary/jupiter/io.jpg is tricky]. <!-- new image from https://photojournal.jpl.nasa.gov/catal *[[Humor/Erlkönig|King IO (freely adapted from Goethe)]]
    5 KB (667 words) - 22:52, 1 May 2024
  • ...is a thread of execution for IO code. Multiple Haskell threads can execute IO code concurrently and they can communicate using shared mutable variables a ...a spark is evaluated in parallel with other computations, or other Haskell IO threads, depends on what your hardware supports and on how your program is
    4 KB (606 words) - 16:32, 17 April 2014
  • ...based on the ideas found in Plan 9 and Inferno, that is, to represent each IO capable resource as a virtual file server exposing a tree of files and dire Source code: http://code.google.com/p/hs-ogl-misc/source/browse/ under the io-layer directory.
    11 KB (1,853 words) - 02:34, 26 April 2021
  • -- that function to take it out of the IO monad? without moving entirely into a "black box" IO-based testing model.
    8 KB (1,214 words) - 00:46, 23 October 2017
  • tablen :: Int -> ([Bool] -> Bool) -> IO ()
    899 bytes (132 words) - 19:51, 18 January 2014
  • main :: IO () mainLoop :: Socket -> IO ()
    11 KB (1,739 words) - 04:19, 19 April 2024
  • all have to do with IO?". Well, in Haskell, IO is a monad. How does this mesh with the notion of a
    18 KB (3,270 words) - 05:36, 9 March 2021
  • storeNewNote :: DB -> Note -> IO () changeNoteContent :: DB -> Doc -> Note -> IO ()
    12 KB (1,556 words) - 15:19, 6 February 2021
  • Instead of state monads (like <hask>IO</hask>), Disciple uses default strict evaluation and effect typing to deal In Haskell, because <hask>putStr</hask> prints to the screen it has the <hask>IO</hask> constructor in its return type:
    5 KB (834 words) - 04:20, 8 June 2023

View (previous 100 | next 100) (20 | 50 | 100 | 250 | 500)