Search results

Jump to navigation Jump to search
  • :* 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
  • , Run Com "uname" ["-s","-r"] "" 36000
    1,023 bytes (104 words) - 15:18, 6 February 2021
  • 1:p:candidates = [6*k+r | k <- [0..], r <- [1,5]] roll (Wheel n rs) = [n*k+r | k <- [0..], r <- rs]
    18 KB (2,583 words) - 20:08, 19 December 2020
  • depth (Node _ l r) = 1 + max (depth l) (depth r) ...<hask>_</hask>). The left branch is named <hask>l</hask>, the right <hask>r</hask>, allowing us to use these values in the right hand side.
    6 KB (1,060 words) - 16:51, 18 June 2021
  • ==R==
    8 KB (1,251 words) - 05:43, 1 September 2022
  • <haskell>(forall a. (t a -> r)) ≅ ((exists a. t a) -> r)</haskell> perimeter (Circle r) = 2 * pi * r
    13 KB (2,093 words) - 10:57, 25 October 2023
  • : hold-sell dup float+ f@ close f@ f* deposit >r 0e r> f! ; ( addr -- )
    3 KB (433 words) - 15:17, 6 February 2021
  • == N-R ==
    4 KB (637 words) - 02:02, 6 May 2024
  • r <- liftIO (newIORef 0) (next r `mplus` next r >> next r `mplus` next r) >> next r `mplus` next r
    13 KB (2,036 words) - 13:54, 4 July 2023
  • Success r >>= k = k r catch (Success r) _ = Success r
    10 KB (1,404 words) - 06:22, 22 January 2020
  • idCPS :: a -> (a -> r) -> r mysqrtCPS :: a -> (a -> r) -> r
    10 KB (1,560 words) - 12:02, 15 April 2024

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