jvm: Call JVM methods from Haskell.

[ bsd3, deprecated, ffi, java, jvm, library ] [ Propose Tags ]
Deprecated

Please see README.md.


[Skip to Readme]

Flags

Automatic Flags
NameDescriptionDefault
linear-types

Build the linear types interface.

Disabled

Use -f <flag> to enable a flag, or -f -<flag> to disable that flag. More info

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.1, 0.1.1, 0.1.2, 0.2.0, 0.2.1, 0.2.2, 0.3.0, 0.4.0, 0.4.0.1, 0.4.1, 0.4.2, 0.5.0, 0.6.0 (info)
Dependencies base (>=4.14 && <5), bytestring (>=0.10), choice (>=0.1), constraints (>=0.8), distributed-closure (>=0.3), exceptions (>=0.8), jni (>=0.7.0 && <0.8), linear-base (==0.1.0.0), singletons (>=2.6), template-haskell, text (>=1.2), vector (>=0.11) [details]
License BSD-3-Clause
Copyright 2015-2016 EURL Tweag.
Author Tweag I/O
Maintainer m@tweag.io
Category FFI, JVM, Java
Home page http://github.com/tweag/inline-java/tree/master/jvm#readme
Source repo head: git clone https://github.com/tweag/inline-java(jvm)
Uploaded by FacundoDominguez at 2020-07-16T18:46:17Z
Distributions
Reverse Dependencies 4 direct, 1 indirect [details]
Downloads 7006 total (37 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs uploaded by user [build log]
All reported builds failed as of 2020-07-16 [all 1 reports]

Readme for jvm-0.5.0

[back to package description]

jvm: Call any JVM function from Haskell

jvm on Stackage LTS jvm on Stackage Nightly

This package enables calling any JVM function from Haskell. If you'd like to call JVM methods using Java syntax and hence get the Java compiler to scope check and type check all your foreign calls, see inline-java, which builds on top of this package.

Example

Graphical Hello World using Java Swing:

{-# LANGUAGE DataKinds #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE UndecidableInstances #-}

import Data.Text (Text)
import Language.Java

newtype JOptionPane = JOptionPane (J ('Class "javax.swing.JOptionPane"))
  deriving Coercible

main :: IO ()
main = withJVM [] $ do
    message <- reflect ("Hello World!" :: Text)
    callStatic
      (classOf (undefined :: JOptionPane))
      "showMessageDialog"
      nullComponent
      (upcast message)
  where
    nullComponent :: J ('Class "java.awt.Component")
    nullComponent = jnull