Skip to content

Commit

Permalink
Move Blockly to Blockly.Internal
Browse files Browse the repository at this point in the history
  • Loading branch information
hrajchert committed Jan 28, 2021
1 parent 43cac8c commit 3d5e72b
Show file tree
Hide file tree
Showing 8 changed files with 9 additions and 9 deletions.
File renamed without changes.
@@ -1,4 +1,4 @@
module Blockly where
module Blockly.Internal where

import Prelude
import Blockly.Types (Block, Blockly, BlocklyState, Workspace)
Expand Down
4 changes: 2 additions & 2 deletions marlowe-playground-client/src/Halogen/ActusBlockly.purs
@@ -1,8 +1,8 @@
module Halogen.ActusBlockly where

import Prelude hiding (div)
import Blockly (BlockDefinition, ElementId(..), XML, getBlockById)
import Blockly as Blockly
import Blockly.Internal (BlockDefinition, ElementId(..), XML, getBlockById)
import Blockly.Internal as Blockly
import Blockly.Generator (Generator, blockToCode)
import Blockly.Types as BT
import Control.Monad.Except (ExceptT(..), except, runExceptT)
Expand Down
4 changes: 2 additions & 2 deletions marlowe-playground-client/src/Halogen/Blockly.purs
@@ -1,8 +1,8 @@
module Halogen.Blockly where

import Prelude hiding (div)
import Blockly (BlockDefinition, ElementId(..), XML, getBlockById)
import Blockly as Blockly
import Blockly.Internal (BlockDefinition, ElementId(..), XML, getBlockById)
import Blockly.Internal as Blockly
import Blockly.Generator (Generator, newBlock, blockToCode)
import Blockly.Types as BT
import Control.Monad.Except (ExceptT(..), except, runExceptT)
Expand Down
2 changes: 1 addition & 1 deletion marlowe-playground-client/src/Halogen/BlocklyCommons.purs
Expand Up @@ -3,7 +3,7 @@
module Halogen.BlocklyCommons where

import Prelude hiding (div)
import Blockly (addChangeListener, removeChangeListener)
import Blockly.Internal (addChangeListener, removeChangeListener)
import Blockly.Events (fromEvent, newParentId, oldParentId)
import Blockly.Types (BlocklyEvent, Workspace)
import Blockly.Types as BT
Expand Down
2 changes: 1 addition & 1 deletion marlowe-playground-client/src/Marlowe/ActusBlockly.purs
@@ -1,7 +1,7 @@
module Marlowe.ActusBlockly where

import Prelude
import Blockly (AlignDirection(..), Arg(..), BlockDefinition(..), block, blockType, category, colour, defaultBlockDefinition, name, style, x, xml, y)
import Blockly.Internal (AlignDirection(..), Arg(..), BlockDefinition(..), block, blockType, category, colour, defaultBlockDefinition, name, style, x, xml, y)
import Blockly.Generator (Generator, getFieldValue, getType, insertGeneratorFunction, mkGenerator, statementToCode)
import Blockly.Types (Block, BlocklyState)
import Control.Alternative ((<|>))
Expand Down
2 changes: 1 addition & 1 deletion marlowe-playground-client/src/Marlowe/Blockly.purs
@@ -1,7 +1,7 @@
module Marlowe.Blockly where

import Prelude
import Blockly (AlignDirection(..), Arg(..), BlockDefinition(..), block, blockType, category, colour, defaultBlockDefinition, getBlockById, initializeWorkspace, name, render, style, x, xml, y)
import Blockly.Internal (AlignDirection(..), Arg(..), BlockDefinition(..), block, blockType, category, colour, defaultBlockDefinition, getBlockById, initializeWorkspace, name, render, style, x, xml, y)
import Blockly.Generator (Connection, Generator, Input, NewBlockFunction, clearWorkspace, connect, connectToOutput, connectToPrevious, fieldName, fieldRow, getBlockInputConnectedTo, getFieldValue, getInputWithName, getType, inputList, inputName, inputType, insertGeneratorFunction, mkGenerator, nextBlock, nextConnection, previousConnection, setFieldText, statementToCode)
import Blockly.Types (Block, BlocklyState, Workspace)
import Control.Alternative ((<|>))
Expand Down
2 changes: 1 addition & 1 deletion marlowe-playground-client/src/Marlowe/Gists.purs
Expand Up @@ -7,7 +7,7 @@ module Marlowe.Gists
) where

import Prelude
import Blockly (XML)
import Blockly.Internal (XML)
import Data.Array (catMaybes)
import Data.Lens (has, view)
import Data.Lens.Index (ix)
Expand Down

0 comments on commit 3d5e72b

Please sign in to comment.