Search results

Jump to navigation Jump to search
  • ...bject <math>A</math> of <math>\mathcal{C}</math> to <math>R^{\mathcal{C}(A,R)}</math> corresponding to the CPS monad in Haskell.
    3 KB (547 words) - 07:53, 16 April 2019
  • tree2ds (Branch x l r) = x:(tree2ds l ++ tree2ds r)
    3 KB (285 words) - 03:44, 10 January 2017
  • | y == x = let (f,r) = getReps ys in (y:f, r)
    2 KB (347 words) - 21:03, 20 December 2018
  • rec p <- newIORef (Node 0 r) r <- newIORef (Node 1 p)
    10 KB (1,757 words) - 23:34, 24 July 2021
  • newtype ContT r m a ...type <hask>a</hask> and a final result of type <hask>r</hask>. The <hask>r</hask> type can be polymorphic most of the time. You only need to specify
    12 KB (2,067 words) - 05:43, 9 March 2021
  • *<code>C-c C-r</code> reload current Haskell interpreter session ...>C-c C-l</code> to load the file. Then, you can go on to type <code>C-c C-r</code> (or simply <code>C-c C-l</code> again) to reload the current module
    2 KB (358 words) - 18:22, 11 April 2016
  • ChurchList { runList :: forall r. (a -> r -> r) -> r -> r }
    4 KB (693 words) - 13:33, 15 April 2024
  • f :: forall %r. () -> () -> Int %r Remember that the <hask>forall %r</hask> at the front of the type is supposed to indicate that the return val
    3 KB (472 words) - 04:20, 8 June 2023
  • instance ParseTree ('Down c ': 'Up ': r) ('Node c '[]) r instance ParseForest ('Down d ': is) (t ': ts) r
    7 KB (1,025 words) - 02:14, 23 July 2021
  • = do r <- getStdRandom (randomR (1,prob)) let curr' = if r == 1 then orig else (next:curr)
    6 KB (855 words) - 12:54, 26 June 2017
  • :* LSE = <code>(\(!_) -> r) (part u)</code> :* RSE = <code>(\(!_) -> r) u</code>
    13 KB (2,108 words) - 12:52, 1 January 2024
  • Right r -> case runDRMonad (f r) s' of type MCPS a = forall r. Cont (M r) a
    6 KB (995 words) - 23:51, 16 April 2021
  • | r == 0 = p : pf ps q where (q, r) = n `divMod` p
    8 KB (1,054 words) - 15:53, 11 October 2015
  • regular n k | r == 1 || n <= k || n < 0 || k < 0 = [] (q, r) = (n * k) `quotRem` 2
    2 KB (388 words) - 03:47, 10 January 2017
  • regexBool r l = l =~ r :: Bool -- simple boolean regex matching
    6 KB (842 words) - 05:27, 8 February 2016
  • where helper left right@(r:rs) n | otherwise = helper (r:left) rs (n - 1)
    3 KB (452 words) - 21:07, 10 March 2019
  • lift2 :: (a -> b -> r) -> (Pair a -> Pair b -> Pair r) ...adFix</hask> and <hask>MonadReader</hask> instance for the type <hask>(->) r</hask>. The <hask>liftM</hask> (see below) functions of this [[monad]] are
    7 KB (1,164 words) - 13:33, 22 May 2024
  • data Cxt a = Top | L (Cxt a) (Tree a) | R (Tree a) (Cxt a) ...was <code>t</code> and whose parent had context <code>c</code>. The <code>R</code> constructor is similar. <code>Top</code> represents the top of a tre
    10 KB (1,623 words) - 21:10, 26 June 2023
  • ...this way we can create instances such as <hask> Forall r Show => Show (Rec r) </hask>. This is available to the application programmer as well. ...h corresponding label) to existing records. Suppose we have a record <hask>r = { x = 0, y = 0 }</hask>. If we have an extensible record system we can th
    25 KB (4,073 words) - 08:53, 9 December 2013
  • foldr (\p r -> p*p > k || k `rem` p /= 0 && r)
    3 KB (432 words) - 07:06, 11 May 2016

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