Search results

Jump to navigation Jump to search
  • , 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
  • ...rep1&type=pdf Performing Lisp Analysis of the FANNKUCH Benchmark], Kenneth R. Anderson and Duane Rettig (27KB PDF) (# s, r# #) -> case setcount c# r# s of
    22 KB (3,539 words) - 00:49, 14 December 2016
  • * /r/haskell
    1 KB (165 words) - 01:05, 12 January 2017
  • cont r n d = m : rest m = (truncate (sqrt (fromIntegral r)) + n) `div` d
    6 KB (979 words) - 10:20, 18 May 2022
  • instance MonadExit e (ReaderT r (Exit e)) where instance Monad m => MonadExit e (ReaderT r (ExitT e m)) where
    4 KB (707 words) - 09:43, 9 December 2014
  • showresp r doc body = case r of
    4 KB (517 words) - 04:59, 26 April 2021
  • > type R = Other R0 > testS = eval (bot :: S P Q R) :: App (App P R) (App Q R)
    10 KB (1,653 words) - 00:25, 12 July 2021
  • snap v origin step = if r==0 then v else v+(step-r) where r = rem (v-origin) step -- NB: origin <= v ; else use MOD
    5 KB (696 words) - 19:46, 18 January 2014
  • arc(u,r). digraph([r,s,t,u,v],[a(s,r),a(s,u),a(u,r),a(u,s),a(v,u)])
    11 KB (1,679 words) - 06:20, 11 June 2023
  • instance (MonadRandom m) => MonadRandom (ReaderT r m) where instance (MonadReader r m, RandomGen g) => MonadReader r (RandT g m) where
    6 KB (894 words) - 13:41, 2 April 2019
  • runUO g = let !(# _, r #) = runRW# (useUO# (g . UO)) in r !r = g h
    11 KB (1,656 words) - 22:33, 4 July 2022

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