companion_cube changed the topic of #ocaml to: Discussions about the OCaml programming language | http://www.ocaml.org | OCaml 4.11 release notes: https://caml.inria.fr/pub/distrib/ocaml-4.11/notes/Changes | Try OCaml in your browser: http://try.ocamlpro.com | Public channel logs at http://irclog.whitequark.org/ocaml
mxns has joined #ocaml
mxns has quit [Ping timeout: 272 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 272 seconds]
mxns has joined #ocaml
<d_bot> <Chum> @sleepydog
mxns has quit [Quit: ZNC 1.8.2 - https://znc.in]
mxns has joined #ocaml
mxns has quit [Ping timeout: 246 seconds]
mxns has joined #ocaml
Tuplanolla has quit [Ping timeout: 240 seconds]
sleepydog has left #ocaml [#ocaml]
sleepydog has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
<d_bot> <Chum> how do u print a function
<d_bot> <Chum> print_int power (x,y)
mxns has quit [Ping timeout: 272 seconds]
mxns has joined #ocaml
<d_bot> <Chum> ```haskell
<d_bot> <Chum> let rev_tup tup = (x,y,z) = (z,y,x);;
<d_bot> <Chum> ```
<d_bot> <Chum> im having truble with this
<d_bot> <Chum> ```haskell
<d_bot> <Chum> rev_tup (1, 2, 3) = (3, 2, 1)
<d_bot> <Chum> ```
<d_bot> <Chum> how can you make this function call
<d_bot> <Chum> when tup is not a list
<d_bot> <Chum> what am i doing wrong
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
borne has quit [Ping timeout: 240 seconds]
borne has joined #ocaml
mxns has quit [Ping timeout: 260 seconds]
oriba has quit [Quit: https://quassel-irc.org - Chat comfortably. Anywhere.]
mxns has joined #ocaml
mxns has quit [Ping timeout: 264 seconds]
mxns has joined #ocaml
<d_bot> <beheddard> `let rev_tup (x, y, z) = (z, y, x)`
Haudegen has quit [Ping timeout: 246 seconds]
mxns has quit [Ping timeout: 265 seconds]
zolk3ri has joined #ocaml
osa1 has quit [Ping timeout: 265 seconds]
mxns has joined #ocaml
inkbottle is now known as zebrag
mxns has quit [Ping timeout: 272 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
borne has quit [Ping timeout: 260 seconds]
mxns has quit [Ping timeout: 272 seconds]
borne has joined #ocaml
mxns has joined #ocaml
mxns has quit [Ping timeout: 260 seconds]
borne has quit [Ping timeout: 260 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 265 seconds]
zolk3ri has quit [Remote host closed the connection]
zolk3ri has joined #ocaml
mxns has joined #ocaml
vicfred has quit [Quit: Leaving]
zolk3ri has quit [Remote host closed the connection]
zolk3ri has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
vicfred has joined #ocaml
mfp has quit [Ping timeout: 246 seconds]
_whitelogger has joined #ocaml
mxns has joined #ocaml
zebrag has quit [Quit: Konversation terminated!]
zebrag has joined #ocaml
zebrag has quit [Client Quit]
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 265 seconds]
<d_bot> <Chum> @beheddard
<d_bot> <Chum> ```ocaml
<d_bot> <Chum> let rec pow x y =
<d_bot> <Chum> if y = 0 then
<d_bot> <Chum> 1
<d_bot> <Chum> else
<d_bot> <Chum> x * pow x(y - 1)
<d_bot> <Chum> ;;
<d_bot> <Chum>
<d_bot> <Chum> print_int (pow (3 1))
<d_bot> <Chum> ```
<d_bot> <Chum> what is wrong with that print line
<d_bot> <Chum> getting an error please
<d_bot> <beheddard> Btw Should so multi line code blocks in the beginner channel since this one is bridges with IRC and it doesn't jive
<d_bot> <beheddard> it should be `(pow 3 1)`
<d_bot> <beheddard> `(3 1)` is attempting to apply 3 to 1 like a function
<d_bot> <beheddard> ( which is obviously a no go )
mxns has joined #ocaml
<d_bot> <Christophe> @Chum the problem is that it's impossible to type a generic reverse function for tuples
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
tizoc has quit [Quit: Coyote finally caught me]
tizoc has joined #ocaml
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
narimiran has joined #ocaml
<d_bot> <lubega-simon> It seems ocamllsp server is down. That's what I see on a project that builds well
<d_bot> <Chum> ```haskell
<d_bot> <Chum> let rec log x y =
<d_bot> <Chum> if y < x then
<d_bot> <Chum> 0
<d_bot> <Chum> else
<d_bot> <Chum> 1 + log((y / x) x)
<d_bot> <Chum> ;;
<d_bot> <Chum> ```
mxns has joined #ocaml
mxns has quit [Ping timeout: 272 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 256 seconds]
osa1 has joined #ocaml
vicfred has quit [Quit: Leaving]
mxns has joined #ocaml
cantstanya has quit [Remote host closed the connection]
cantstanya has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
Tuplanolla has joined #ocaml
olle has joined #ocaml
zolk3ri has quit [Remote host closed the connection]
Mahak has joined #ocaml
<Mahak> Hi!
<Mahak> I'm a newbie.
<Mahak> How should I start contributing ?
olle has quit [Ping timeout: 240 seconds]
bartholin has joined #ocaml
orbifx has joined #ocaml
orbifx has quit [Ping timeout: 246 seconds]
mxns has joined #ocaml
Mahak has quit [Ping timeout: 240 seconds]
mxns has quit [Ping timeout: 264 seconds]
ewd has joined #ocaml
orbifx has joined #ocaml
orbifx has quit [Client Quit]
Haudegen has joined #ocaml
bartholin has quit [Ping timeout: 265 seconds]
nullcone has quit [Quit: Connection closed for inactivity]
ArthurStrong has joined #ocaml
mfp has joined #ocaml
Mahak has joined #ocaml
mxns has joined #ocaml
mxns has quit [Ping timeout: 272 seconds]
Nikita_Sen has joined #ocaml
Nikita_Sen has quit [Client Quit]
Nikita_Sen has joined #ocaml
mxns has joined #ocaml
mxns has quit [Ping timeout: 264 seconds]
Mahak has quit [Quit: Ping timeout (120 seconds)]
mxns has joined #ocaml
orbifx has joined #ocaml
mxns has quit [Ping timeout: 258 seconds]
kafilat has joined #ocaml
mxns has joined #ocaml
vicfred has joined #ocaml
mxns has quit [Ping timeout: 260 seconds]
tane has joined #ocaml
ArthurSt1ong has joined #ocaml
mxns has joined #ocaml
nullcone has joined #ocaml
olle has joined #ocaml
olle has quit [Ping timeout: 240 seconds]
arecaceae has joined #ocaml
ArthurSt1ong has quit [Quit: leaving]
mxns has quit [Ping timeout: 246 seconds]
kafilat has quit [Quit: Connection closed for inactivity]
<d_bot> <EduardoRFS> Why does OCaml needs the value restriction stuff when calling pure functions?
<d_bot> <Drup> @EduardoRFS How do you know the function is pure ?
<d_bot> <EduardoRFS> there is no impure side effect on it? Seems like a easy property to track on the type system
<d_bot> <Drup> Nothing in the type system *right now* indicates if a function is pure or not
<d_bot> <Drup> Right, so you are asking for an algebraic effect system :3
<d_bot> <Drup> (In particular, now high order functions need to talk about effects, all the types of high order effects functions need to change to account for it)
<d_bot> <Drup> In any case, in the algebraic effect prototype, there is no value restriction when calling pure functions.
Anarchos has joined #ocaml
Anarchos has quit [Quit: Vision[0.10.3]: i've been blurred!]
mxns has joined #ocaml
<orbifx> can Bos.OS.* or Fpath.* do any home-dir expansions? I.e. interpret `~/..`?
ymherklotz has joined #ocaml
Anarchos has joined #ocaml
Nikita_Sen has quit [Quit: Connection closed]
mxns has quit [Ping timeout: 258 seconds]
Jesin has quit [Quit: Leaving]
Jesin has joined #ocaml
Jesin has quit [Remote host closed the connection]
mxns has joined #ocaml
Jesin has joined #ocaml
mxns has quit [Ping timeout: 265 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 256 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 246 seconds]
DanielRichman has quit [Quit: leaving]
DanielRichman has joined #ocaml
DanielRichman has left #ocaml [#ocaml]
Jesin has quit [Quit: Leaving]
Jesin has joined #ocaml
mxns has joined #ocaml
ArthurStrong has quit [Ping timeout: 264 seconds]
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
mxns has quit [Client Quit]
mxns has joined #ocaml
mxns has quit [Ping timeout: 272 seconds]
mxns has joined #ocaml
zebrag has joined #ocaml
Anarchos has quit [Ping timeout: 264 seconds]
mxns has quit [Ping timeout: 246 seconds]
boxscape has joined #ocaml
mxns has joined #ocaml
mxns has quit [Quit: ZNC 1.8.2 - https://znc.in]
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
Anarchos has joined #ocaml
boxscape has quit [Quit: Connection closed]
boxscape has joined #ocaml
ArthurStrong has joined #ocaml
Anarchos has quit [Quit: Vision[0.10.3]: i've been blurred!]
Anarchos has joined #ocaml
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
olle has joined #ocaml
Anarchos has quit [Quit: Vision[0.10.3]: i've been blurred!]
mxns has joined #ocaml
<d_bot> <drizzy> How do you print a list
<d_bot> <drizzy> Print_list doesn’t work
mxns has quit [Ping timeout: 265 seconds]
mxns has joined #ocaml
<orbifx> drizzy: List.iter (fun x -> print_* ...)
<d_bot> <drizzy> I’m a little new to this @orbifx
<d_bot> <drizzy> Can you use that in an example please
<d_bot> <drizzy> List = [1,2,3]
mxns has quit [Ping timeout: 260 seconds]
mxns has joined #ocaml
<ymherklotz> Maybe something like this?: List.iter (Printf.printf "%d; ") [1; 2; 3]
mxns has quit [Ping timeout: 240 seconds]
<octachron> Using the `fmt` library: `Fmt.(pr "@[[%a]@]" (list ~sep:comma int) [1;2;3])`
<orbifx> drizzy, fmt is printing on steroids, don't let it scare you :P
orbifx has quit [Quit: orbifx]
<d_bot> <Drup> @octachron `Fmt.Dump.list` 😉
<d_bot> <octachron> Better indeed.
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 258 seconds]
ymherklotz has quit [Ping timeout: 260 seconds]
<d_bot> <Chum> this is incorrect i believe
<d_bot> <octachron> This is correct, except for the last `;` .
<d_bot> <octachron> (it prints "1 ; 2 ; 3 ;")
narimiran has quit [Ping timeout: 265 seconds]
mxns has joined #ocaml
ymherklotz has joined #ocaml
mxns has quit [Ping timeout: 258 seconds]
mxns has joined #ocaml
<d_bot> <Pacc> does anyone know if disml allows for user tokens to be used with the library
mxns has quit [Ping timeout: 240 seconds]
ymherklotz has quit [Ping timeout: 272 seconds]
mxns has joined #ocaml
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
ArthurStrong has quit [Quit: leaving]
olle has quit [Ping timeout: 240 seconds]
mxns has quit [Ping timeout: 240 seconds]
mxns has joined #ocaml
<d_bot> <Splingush> > You may not use self-bots or user-bots to access Discord.
<d_bot> <Splingush> <https://discord.com/guidelines>
<d_bot> <Splingush> Discord itself prohibits the usage of a user-token with bot-applications.
<d_bot> <Pacc> I know I just want to know if it's possible so I can make a discord client
mxns has quit [Ping timeout: 272 seconds]
tane has quit [Quit: Leaving]
mxns has joined #ocaml
mxns has quit [Ping timeout: 272 seconds]
arecaceae has quit [Remote host closed the connection]
arecaceae has joined #ocaml
<d_bot> <beheddard> Discord already has history of shutting down third party clients
mxns has joined #ocaml