Commit 2303ffed authored by François Lavallée's avatar François Lavallée

ajout du modèle en scala

parent ece551c3
......@@ -9,6 +9,7 @@ library(dplyr)
library(ggplot2)
library(gganimate)
library(gifski)
library(pracma)
theme_set(theme_bw())
## import functions from utils
......@@ -99,10 +100,6 @@ plot_oneTime(t,v1, v2, v3, r1B, r1C, r2D, r2E, r3F, r3G, alphaH, alphaI, angleIn
# create a dataframe with positions at times prescribed
df = create_df(times,v1,v2,v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,angleIni_D,angleIni_F)
# save plots for different times
......@@ -134,6 +131,10 @@ times = seq(0,20, by = timeStep)
# param de reférence
df = create_df(times,v1,v2,v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,angleIni_D,angleIni_F)
df = create_df(times,v1,v2,v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,angleIni_D,angleIni_F)
# astroide
# influence vitesse: multiplication un même facteur
df = create_df(times,3*v1,3*v2,3*v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,angleIni_D,angleIni_F)
# influence vitesse: seul v2 modifié
......@@ -146,7 +147,7 @@ df = create_df(times,v1,0,0,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,0,a
# v1=0
df = create_df(times,0,v2,v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,angleIni_D,angleIni_F)
df = create_df(times,v1,0.3,v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,0,angleIni_F)
df = create_df(times,v1,0.3,sqrt(2)*v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,0,angleIni_F)
# mesures
......@@ -174,6 +175,35 @@ df = df %>% mutate( # distance
)
# points
# create a dataframe with positions at times prescribed
# astroide
timeStep = 0.005 # sec
times = seq(0,5, by = timeStep)
df = create_df(times,v1,v2=-3/4*v1,v3,r1B,r1C,r1B/8,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,angleIni_D,angleIni_F)
#p <- ggplot(df %>% filter(times < 1.5)) + coord_fixed(ratio=1) +
p <- ggplot(df) + coord_fixed(ratio=1) +
theme(axis.title.x=element_blank(), axis.title.y=element_blank() ) +
#geom_point(aes(x=Bx, y=By), size=1) +
#geom_point(aes(x=Cx, y=Cy), size=1) +
geom_point(aes(x=Dx, y=Dy), size=1, col= "red", shape = 3) #+
#geom_point(aes(x=Ex, y=Ey), size=1, col= "yellow") +
#geom_point(aes(x=Fx, y=Fy), size=1, col= "blue") +
#geom_point(aes(x=Gx, y=Gy), size=1, col= "green")
p
#p <- ggplot(df %>% filter(times < 1.5)) + coord_fixed(ratio=1) +
p <- ggplot(df) + coord_fixed(ratio=1) +
theme(axis.title.x=element_blank(), axis.title.y=element_blank() ) +
......@@ -415,8 +445,6 @@ timeStep = 0.02 # sec
times = seq(0,5, by = timeStep)
# u: tension imposée = vitesse demandée au moteur
# u= rep(1,length(times))
# temp = A/C*u*exp(1/C*times)
u = function(t){
1*(t>0)*(t<1)+
......@@ -427,22 +455,6 @@ u = function(t){
plot(times,u(times), type = "l")
# temp = function(t){
# A/C*u(t)*exp(1/C*t)
# }
# vitesse = exp(-1/C*times)
# plot(times,vitesse, type = "l")
# temp2 = unlist(sapply(times, function(t){integrate(temp,0,t)$value}))
# integrate(temp,0,1)
# integrate(temp,0,1)[1]
# integrate(temp,0,1)$value
# vitesse = exp(-1/C*times) * temp2
# plot(times,vitesse, type = "l")
t=1
res = vitesse_rotation_moteur(t,u,A,C)
res = vitesse_rotation_moteur(times,u,A,C)
......@@ -453,6 +465,7 @@ angle_t = integrate(function(x){vitesse_rotation_moteur(x,u,A,C)},0,t, stop.on.
angle_all = sapply(times, function(a){integrate(function(x){vitesse_rotation_moteur(x,u,A,C)},0,a, stop.on.error = F)$value})
plot(times,angle_all)
# moteur 1
u1=u
A1=A
......@@ -485,10 +498,7 @@ plot_oneTime_TRANSITOIRE(t, r1B, r1C, r2D, r2E, r3F, r3G,
timeStep = 0.005
finalTime = 10
times = seq(0,finalTime, by = timeStep)
# des u differents
u1 = function(t){
2
}
......@@ -522,20 +532,20 @@ p <- ggplot(df) + coord_fixed(ratio=1) +
p
res = vitesse_rotation_moteur(times,u1,A1,C1)
plot(times, res, type = "l")
# res = vitesse_rotation_moteur(times,u1,A1,C1)
# plot(times, res, type = "l")
dirRes = "plot_transitoire_1"
dirRes = "plot_transitoire_2"
dir.create(dirRes)
times = seq(0,5, by = 0.02)
start_time <- Sys.time()
savePlot_index_and_paramsInFile_TRANSITOIRE(times, dirRes, r1B, r1C, r2D, r2E, r3F, r3G,
alphaH, alphaI, angleIni_B, angleIni_D, angleIni_F,
A1,C1,A2,C2,A3,C3,
u1,u2,u3)
end_time <- Sys.time()
end_time - start_time
# start_time <- Sys.time()
# savePlot_index_and_paramsInFile_TRANSITOIRE(times, dirRes, r1B, r1C, r2D, r2E, r3F, r3G,
# alphaH, alphaI, angleIni_B, angleIni_D, angleIni_F,
# A1,C1,A2,C2,A3,C3,
# u1,u2,u3)
# end_time <- Sys.time()
# end_time - start_time
# savePlot_index_and_paramsInFile(times,dirRes,v1,v2,v3,r1B,r1C,r2D,r2E,r3F,r3G,alphaH,alphaI,angleIni_B,angleIni_D,angleIni_F)
......@@ -544,4 +554,21 @@ end_time - start_time
# test other computation integral
#quadinf(fun, -Inf, Inf, tol=1e-10)
start_time <- Sys.time()
angle_all = sapply(times, function(a){integrate(function(x){vitesse_rotation_moteur(x,u,A,C)},0,a, stop.on.error = F)$value})
end_time <- Sys.time()
end_time - start_time
start_time <- Sys.time()
angle_all = sapply(times, function(a){quadinf(function(x){vitesse_rotation_moteur(x,u,A,C)},0,a)$value})
end_time <- Sys.time()
end_time - start_time
......@@ -9,6 +9,7 @@ library(dplyr)
library(ggplot2)
library(gganimate)
library(gifski)
library(pracma)
theme_set(theme_bw())
......@@ -364,6 +365,10 @@ scalarProdutRenormalized = function(x1,y1,x2,y2){
#########################
### TRANSITOIRE ###
#########################
# renvoit la vitesse du moteur en fonction de la vitesse demandée
vitesse_rotation_moteur <- function(time,u,A,C) {
......@@ -378,124 +383,61 @@ vitesse_rotation_moteur <- function(time,u,A,C) {
# next_positions_t_TRANSITOIRE = function(t, r1B, r1C, r2D, r2E, r3F, r3G,
# alphaH, alphaI,
# #angleIni_B, angleIni_D, angleIni_F,
# A1,C1,A2,C2,A3,C3,
# u1,u2,u3,
# Bx,By,Cx,Cy,
# Hx,Hy,
# Dx,Dy,Ex,Ey,
# Ix,Iy,
# Fx,Fy,Gx,Gy,
# currentStateDf, deltaT){
#
# vitesse1 = vitesse_rotation_moteur(t,u1,A1,C1)
# vitesse2 = vitesse_rotation_moteur(t,u2,A2,C2)
# vitesse3 = vitesse_rotation_moteur(t,u3,A3,C3)
#
# # B,C
# newBx = currentStateDf$Bx + r1B * cos(2*pi*vitesse1*deltaT)
# newBy = currentStateDf$By + r1B * sin(2*pi*vitesse1*deltaT ) #+ angleIni_B
# newCx = currentStateDf$Cx + r1C * cos(2*pi*vitesse1*deltaT ) #+angleIni_B+pi
# newCy = currentStateDf$Cy + r1C * sin(2*pi*vitesse1*deltaT ) #+ angleIni_B+pi
#
# # H,I
# newHx = newBx / alphaH
# newHy = newBy / alphaH
# newIx = newCx / alphaI
# newIy = newCy / alphaI
# # position de H sur AB: alpha in [1,+infty], =1 => B, =2 milieu de AB, =+infty => A
#
# # D,E
# #r1H = r1B / alphaH
# newHDx = currentStateDf$HDx + r2D * cos(2*pi*(vitesse2+vitesse1)*deltaT) # + (angleIni_D+ angleIni_B))
# newHDy = currentStateDf$HDy + r2D * sin(2*pi*(vitesse2+vitesse1)*deltaT) # + (angleIni_D+ angleIni_B))
# newHEx = currentStateDf$HEx + r2E * cos(2*pi*(vitesse2+vitesse1)*deltaT) # + (angleIni_D+ angleIni_B) +pi)
# newHEy = currentStateDf$HEy + r2E * sin(2*pi*(vitesse2+vitesse1)*deltaT) # + (angleIni_D+ angleIni_B) +pi)
#
# newDx = newHx + newHDx
# newDy = newHy + newHDy
# newEx = newHx + newHEx
# newEy = newHy + newHEy
#
# # F,G
# #r1I = r1C / alphaI
# newIFx = currentStateDf$IFx + r3F * cos(2*pi*(vitesse3+vitesse1)*deltaT) #+ (angleIni_F+ (angleIni_B+pi)) )
# newIFy = currentStateDf$IFy + r3F * sin(2*pi*(vitesse3+vitesse1)*deltaT) #+ (angleIni_F+ (angleIni_B+pi)))
# newIGx = currentStateDf$IGx + r3G * cos(2*pi*(vitesse3+vitesse1)*deltaT) #+ (angleIni_F+ (angleIni_B+pi)) +pi)
# newIGy = currentStateDf$IGy + r3G * sin(2*pi*(vitesse3+vitesse1)*deltaT) #+ (angleIni_F+ (angleIni_B+pi)) +pi)
#
# newFx = newIx + newIFx
# newFy = newIy + newIFy
# newGx = newIx + newIGx
# newGy = newIy + newIGy
#
#
# return(data.frame(Bx = newBx, By = newBy, Cx = newCx, Cy = newCy,
# Hx = newHx, Hy = newHy,
# Dx = newDx, Dy = newDy, Ex = newEx, Ey = newEy,
# Ix = newIx, Iy = newIy,
# Fx = newFx, Fy = newFy, Gx = newGx, Gy = newGy,
# time = t+deltaT))
#
# }
# create_position_ini_TRANSITOIRE = function(r1B, r1C, r2D, r2E, r3F, r3G,
# alphaH, alphaI,
# angleIni_B, angleIni_D, angleIni_F){
#
# # B,C
# Bx = r1B * cos(angleIni_B)
# By = r1B * sin(angleIni_B)
# Cx = r1C * cos(angleIni_B+pi)
# Cy = r1C * sin(angleIni_B+pi)
#
# # H,I
# Hx = Bx / alphaH
# Hy = By / alphaH
# Ix = Cx / alphaI
# Iy = Cy / alphaI
#
# # D,E
# HDx = r2D * cos((angleIni_D+ angleIni_B))
# HDy = r2D * sin((angleIni_D+ angleIni_B))
# HEx = r2E * cos((angleIni_D+ angleIni_B) +pi)
# HEy = r2E * sin((angleIni_D+ angleIni_B) +pi)
#
# Dx = Hx + HDx
# Dy = Hy + HDy
# Ex = Hx + HEx
# Ey = Hy + HEy
#
# # F,G
# #r1I = r1C / alphaI
# IFx = r3F * cos((angleIni_F+ (angleIni_B+pi)) )
# IFy = r3F * sin((angleIni_F+ (angleIni_B+pi)))
# IGx = r3G * cos((angleIni_F+ (angleIni_B+pi)) +pi)
# IGy = r3G * sin((angleIni_F+ (angleIni_B+pi)) +pi)
#
# Fx = Ix + IFx
# Fy = Iy + IFy
# Gx = Ix + IGx
# Gy = Iy + IGy
#
#
# return(data.frame(Bx = Bx, By = By, Cx = Cx, Cy = Cy,
# Hx = Hx, Hy = Hy,
# Dx = Dx, Dy = Dy, Ex = Ex, Ey = Ey,
# Ix = Ix, Iy = Iy,
# Fx = Fx, Fy = Fy, Gx = Gx, Gy = Gy,
# time = 0)
# )
#
# }
# position at time t transitoire
positions_t_TRANSITOIRE= function(t, r1B, r1C, r2D, r2E, r3F, r3G,
alphaH, alphaI, angleIni_B, angleIni_D, angleIni_F,
A1,C1,A2,C2,A3,C3,
u1,u2,u3){
angle1_t = integrate(function(x){vitesse_rotation_moteur(x,u1,A1,C1)},0,t, stop.on.error = F)$value
angle2_t = integrate(function(x){vitesse_rotation_moteur(x,u2,A2,C2)},0,t, stop.on.error = F)$value
angle3_t = integrate(function(x){vitesse_rotation_moteur(x,u3,A3,C3)},0,t, stop.on.error = F)$value
# B,C
Bx = r1B * cos(2*pi*angle1_t + angleIni_B)
By = r1B * sin(2*pi*angle1_t + angleIni_B)
Cx = r1C * cos(2*pi*angle1_t + angleIni_B+pi)
Cy = r1C * sin(2*pi*angle1_t + angleIni_B+pi)
# H,I
Hx = Bx / alphaH
Hy = By / alphaH
Ix = Cx / alphaI
Iy = Cy / alphaI
# position de H sur AB: alpha in [1,+infty], =1 => B, =2 milieu de AB, =+infty => A
# D,E
#r1H = r1B / alphaH
HDx = r2D * cos(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B))
HDy = r2D * sin(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B))
HEx = r2E * cos(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B) +pi)
HEy = r2E * sin(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B) +pi)
Dx = Hx + HDx
Dy = Hy + HDy
Ex = Hx + HEx
Ey = Hy + HEy
# F,G
#r1I = r1C / alphaI
IFx = r3F * cos(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)) )
IFy = r3F * sin(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)))
IGx = r3G * cos(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)) +pi)
IGy = r3G * sin(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)) +pi)
Fx = Ix + IFx
Fy = Iy + IFy
Gx = Ix + IGx
Gy = Iy + IGy
return(data.frame(Bx = Bx, By = By, Cx = Cx, Cy = Cy,
Hx = Hx, Hy = Hy,
Dx = Dx, Dy = Dy, Ex = Ex, Ey = Ey,
Ix = Ix, Iy = Iy,
Fx = Fx, Fy = Fy, Gx = Gx, Gy = Gy) )
}
......@@ -538,6 +480,7 @@ plot_oneTime_TRANSITOIRE = function(t, r1B, r1C, r2D, r2E, r3F, r3G,
create_df_TRANSITOIRE = function(times, r1B, r1C, r2D, r2E, r3F, r3G,
alphaH, alphaI, angleIni_B, angleIni_D, angleIni_F,
A1,C1,A2,C2,A3,C3,
......@@ -677,6 +620,7 @@ save_params_in_file_TRANSITOIRE = function(dirRes, r1B, r1C, r2D, r2E, r3F, r3G,
# save plots with index (time) and parameters in a file TRANSITOIRE
savePlot_index_and_paramsInFile_TRANSITOIRE = function(times, dirRes, r1B, r1C, r2D, r2E, r3F, r3G,
alphaH, alphaI, angleIni_B, angleIni_D, angleIni_F,
......@@ -699,60 +643,6 @@ savePlot_index_and_paramsInFile_TRANSITOIRE = function(times, dirRes, r1B, r1C,
positions_t_TRANSITOIRE= function(t, r1B, r1C, r2D, r2E, r3F, r3G,
alphaH, alphaI, angleIni_B, angleIni_D, angleIni_F,
A1,C1,A2,C2,A3,C3,
u1,u2,u3){
angle1_t = integrate(function(x){vitesse_rotation_moteur(x,u1,A1,C1)},0,t, stop.on.error = F)$value
angle2_t = integrate(function(x){vitesse_rotation_moteur(x,u2,A2,C2)},0,t, stop.on.error = F)$value
angle3_t = integrate(function(x){vitesse_rotation_moteur(x,u3,A3,C3)},0,t, stop.on.error = F)$value
# B,C
Bx = r1B * cos(2*pi*angle1_t + angleIni_B)
By = r1B * sin(2*pi*angle1_t + angleIni_B)
Cx = r1C * cos(2*pi*angle1_t + angleIni_B+pi)
Cy = r1C * sin(2*pi*angle1_t + angleIni_B+pi)
# H,I
Hx = Bx / alphaH
Hy = By / alphaH
Ix = Cx / alphaI
Iy = Cy / alphaI
# position de H sur AB: alpha in [1,+infty], =1 => B, =2 milieu de AB, =+infty => A
# D,E
#r1H = r1B / alphaH
HDx = r2D * cos(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B))
HDy = r2D * sin(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B))
HEx = r2E * cos(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B) +pi)
HEy = r2E * sin(2*pi*(angle1_t+angle2_t) + (angleIni_D+ angleIni_B) +pi)
Dx = Hx + HDx
Dy = Hy + HDy
Ex = Hx + HEx
Ey = Hy + HEy
# F,G
#r1I = r1C / alphaI
IFx = r3F * cos(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)) )
IFy = r3F * sin(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)))
IGx = r3G * cos(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)) +pi)
IGy = r3G * sin(2*pi*(angle1_t+angle3_t) + (angleIni_F+ (angleIni_B+pi)) +pi)
Fx = Ix + IFx
Fy = Iy + IFy
Gx = Ix + IGx
Gy = Iy + IGy
return(data.frame(Bx = Bx, By = By, Cx = Cx, Cy = Cy,
Hx = Hx, Hy = Hy,
Dx = Dx, Dy = Dy, Ex = Ex, Ey = Ey,
Ix = Ix, Iy = Iy,
Fx = Fx, Fy = Fy, Gx = Gx, Gy = Gy) )
}
......
......@@ -435,7 +435,20 @@ Points doubles: $t_1$ et $t_2$ tels que: $x(t_1)=x(t_2)$ et $y(t_1) = y(t_2)$.
\section{Mesures}
La corube est elle fermée (périodicité)
Stationnaire:
La trajectoire remplit l'espace ?
Nombre de point singulier: seuil sur la dérivée
nombre de boucle: c'est quoi une boucle ?
concavité/ convexité locale?: rayon de courbure: les distribution des rayons de courbure sur la trajectoire: diversité ou uniforme ?
Nombre de composantes connexes dans l'espace (Julien ?, JTS lib scala pour les trucs de géométrie)
%https://locationtech.github.io/jts/javadoc/org/locationtech/jts/geom/Geometry.html
La courbe est elle fermée (périodicité)
boucles
......@@ -443,7 +456,7 @@ point de rebroussement
ligne droite
Indice de Moran (agrégation spatiale?)
Indice de Moran (agrégation spatiale? voir avec Juste pour la lib à importer en scala)
Sur les vitesses, accélération ?
......
<?xml version="1.0" encoding="UTF-8"?>
<project version="4">
<component name="HydraSettings">
<option name="hydraStorePath" value="$PROJECT_DIR$/.hydra/idea" />
<option name="noOfCores" value="2" />
<option name="projectRoot" value="$PROJECT_DIR$" />
<option name="sourcePartitioner" value="auto" />
</component>
</project>
\ No newline at end of file
<component name="libraryTable">
<library name="sbt: org.scala-lang:scala-library:2.13.0:jar" type="Scala">
<properties>
<compiler-classpath>
<root url="file://$USER_HOME$/.ivy2/cache/jline/jline/jars/jline-2.14.6.jar" />
<root url="file://$USER_HOME$/.ivy2/cache/org.scala-lang/scala-compiler/jars/scala-compiler-2.13.0.jar" />
<root url="file://$USER_HOME$/.ivy2/cache/org.scala-lang/scala-library/jars/scala-library-2.13.0.jar" />
<root url="file://$USER_HOME$/.ivy2/cache/org.scala-lang/scala-reflect/jars/scala-reflect-2.13.0.jar" />
</compiler-classpath>
</properties>
<CLASSES>
<root url="jar://$USER_HOME$/.ivy2/cache/org.scala-lang/scala-library/jars/scala-library-2.13.0.jar!/" />
</CLASSES>
<JAVADOC />
<SOURCES>
<root url="jar://$USER_HOME$/.ivy2/cache/org.scala-lang/scala-library/srcs/scala-library-2.13.0-sources.jar!/" />
</SOURCES>
</library>
</component>
\ No newline at end of file
<?xml version="1.0" encoding="UTF-8"?>
<project version="4">
<component name="ProjectRootManager" version="2" languageLevel="JDK_1_8" default="false" project-jdk-name="1.8" project-jdk-type="JavaSDK">
<output url="file://$PROJECT_DIR$/out" />
</component>
</project>
\ No newline at end of file
<?xml version="1.0" encoding="UTF-8"?>
<project version="4">
<component name="ProjectModuleManager">
<modules>
<module fileurl="file://$PROJECT_DIR$/.idea/modules/scala.iml" filepath="$PROJECT_DIR$/.idea/modules/scala.iml" />
<module fileurl="file://$PROJECT_DIR$/.idea/modules/scala-build.iml" filepath="$PROJECT_DIR$/.idea/modules/scala-build.iml" />
</modules>
</component>
</project>
\ No newline at end of file
This diff is collapsed.
<?xml version="1.0" encoding="UTF-8"?>
<module external.linked.project.id="scala" external.linked.project.path="$MODULE_DIR$/../.." external.root.project.path="$MODULE_DIR$/../.." external.system.id="SBT" type="JAVA_MODULE" version="4">
<component name="NewModuleRootManager" LANGUAGE_LEVEL="JDK_1_8">
<output url="file://$MODULE_DIR$/../../target/scala-2.13/classes" />
<output-test url="file://$MODULE_DIR$/../../target/scala-2.13/test-classes" />
<exclude-output />
<content url="file://$MODULE_DIR$/../..">
<sourceFolder url="file://$MODULE_DIR$/../../src/main/java" isTestSource="false" />
<sourceFolder url="file://$MODULE_DIR$/../../src/main/scala" isTestSource="false" />
<sourceFolder url="file://$MODULE_DIR$/../../src/main/scala-2.13" isTestSource="false" />
<sourceFolder url="file://$MODULE_DIR$/../../src/test/java" isTestSource="true" />
<sourceFolder url="file://$MODULE_DIR$/../../src/test/scala" isTestSource="true" />
<sourceFolder url="file://$MODULE_DIR$/../../src/test/scala-2.13" isTestSource="true" />
<sourceFolder url="file://$MODULE_DIR$/../../target/scala-2.13/src_managed/main" isTestSource="false" generated="true" />
<sourceFolder url="file://$MODULE_DIR$/../../target/scala-2.13/src_managed/test" isTestSource="true" generated="true" />
<sourceFolder url="file://$MODULE_DIR$/../../src/main/resources" type="java-resource" />
<sourceFolder url="file://$MODULE_DIR$/../../target/scala-2.13/resource_managed/main" type="java-resource" />
<sourceFolder url="file://$MODULE_DIR$/../../src/test/resources" type="java-test-resource" />
<sourceFolder url="file://$MODULE_DIR$/../../target/scala-2.13/resource_managed/test" type="java-test-resource" />
<excludeFolder url="file://$MODULE_DIR$/../../target" />
</content>
<orderEntry type="inheritedJdk" />
<orderEntry type="sourceFolder" forTests="false" />
<orderEntry type="library" name="sbt: org.scala-lang:scala-library:2.13.0:jar" level="project" />
</component>
</module>
\ No newline at end of file
<?xml version="1.0" encoding="UTF-8"?>
<project version="4">
<component name="ScalaSbtSettings">
<option name="linkedExternalProjectsSettings">
<SbtProjectSettings>
<option name="externalProjectPath" value="$PROJECT_DIR$" />
<option name="modules">
<set>
<option value="$PROJECT_DIR$" />
<option value="$PROJECT_DIR$/project" />
</set>
</option>
<option name="sbtVersion" value="1.2.8" />
</SbtProjectSettings>
</option>
</component>
</project>
\ No newline at end of file
<?xml version="1.0" encoding="UTF-8"?>
<project version="4">
<component name="ScalaCompilerConfiguration">
<profile name="sbt 1" modules="scala" />
</component>
</project>
\ No newline at end of file
This diff is collapsed.
name := "scala"
version := "0.1"
scalaVersion := "2.13.0"
//libraryDependencies +=
\ No newline at end of file
sbt.version = 1.2.8
\ No newline at end of file
{"uri":"local:///home/francois/.sbt/1.0/server/dd23a66294a9f186c05b/sock"}
\ No newline at end of file
sbt.internal.DslEntry
\ No newline at end of file
sbt.internal.DslEntry
\ No newline at end of file
sbt.internal.DslEntry
\ No newline at end of file
#default#scala-build;0.1.0-SNAPSHOT resolved revisions
#Mon Jul 22 20:15:20 CEST 2019
+organisation\:\#@\#\:+org.scala-lang\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+scala-library\:\#@\#\:+revision\:\#@\#\:+2.12.7\:\#@\#\:=2.12.7 ? 2.12.7 null
+organisation\:\#@\#\:+org.scala-lang\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+scala-compiler\:\#@\#\:+revision\:\#@\#\:+2.12.7\:\#@\#\:=2.12.7 release 2.12.7 null
+organisation\:\#@\#\:+org.scala-sbt\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+sbt\:\#@\#\:+revision\:\#@\#\:+1.2.8\:\#@\#\:=1.2.8 release 1.2.8 null
<?xml version="1.0" encoding="UTF-8"?>
<ivy-module version="2.0" xmlns:e="http://ant.apache.org/ivy/extra">
<info organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
status="integration"
publication="20190722201516"
e:sbtVersion="1.0" e:scalaVersion="2.12"
>
<description>
scala-build
</description>
</info>
<configurations>
<conf name="compile" visibility="public" description=""/>
<conf name="runtime" visibility="public" description="" extends="compile"/>
<conf name="test" visibility="public" description="" extends="runtime"/>
<conf name="provided" visibility="public" description=""/>
<conf name="optional" visibility="public" description=""/>
<conf name="compile-internal" visibility="private" description="" extends="compile,optional,provided"/>
<conf name="runtime-internal" visibility="private" description="" extends="runtime,optional"/>
<conf name="test-internal" visibility="private" description="" extends="test,optional,provided"/>
<conf name="plugin" visibility="private" description=""/>
<conf name="pom" visibility="public" description=""/>
<conf name="scala-tool" visibility="private" description=""/>
</configurations>
<publications>
<artifact name="scala-build" type="pom" ext="pom" conf="pom"/>
<artifact name="scala-build" type="jar" ext="jar" conf="compile"/>
<artifact name="scala-build" type="src" ext="jar" conf="compile" e:classifier="sources"/>
<artifact name="scala-build" type="doc" ext="jar" conf="compile" e:classifier="javadoc"/>
</publications>
<dependencies>
<dependency org="org.scala-lang" name="scala-compiler" rev="2.12.7" conf="scala-tool->default,optional(default)"/>
<dependency org="org.scala-lang" name="scala-library" rev="2.12.7" conf="scala-tool->default,optional(default);provided->default(compile)"/>
<dependency org="org.scala-sbt" name="sbt" rev="1.2.8" conf="provided->default(compile)"/>
<override org="org.scala-sbt" module="scripted-plugin_2.12" matcher="exact" rev="1.2.8"/>
</dependencies>
</ivy-module>
This source diff could not be displayed because it is too large. You can view the blob instead.
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="compile"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
</dependencies>
</ivy-report>
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="optional"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
</dependencies>
</ivy-report>
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="plugin"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
</dependencies>
</ivy-report>
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="pom"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
</dependencies>
</ivy-report>
This source diff could not be displayed because it is too large. You can view the blob instead.
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="runtime-internal"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
</dependencies>
</ivy-report>
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="runtime"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
</dependencies>
</ivy-report>
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="scala-tool"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
<module organisation="org.scala-lang" name="scala-compiler">
<revision name="2.12.7" status="release" pubdate="20180927103727" resolver="sbt-chain" artresolver="sbt-chain" homepage="http://www.scala-lang.org/" downloaded="false" searched="false" default="false" conf="default, compile, runtime, optional, optional(default), master" position="0">
<license name="BSD 3-Clause" url="http://www.scala-lang.org/license.html"/>
<metadata-artifact status="no" details="" size="2939" time="0" location="/home/francois/.ivy2/cache/org.scala-lang/scala-compiler/ivy-2.12.7.xml" searched="false" origin-is-local="false" origin-location="https://repo1.maven.org/maven2/org/scala-lang/scala-compiler/2.12.7/scala-compiler-2.12.7.pom"/>
<caller organisation="default" name="scala-build" conf="scala-tool" rev="2.12.7" rev-constraint-default="2.12.7" rev-constraint-dynamic="2.12.7" callerrev="0.1.0-SNAPSHOT"/>
<artifacts>
<artifact name="scala-compiler" type="jar" ext="jar" status="no" details="" size="10478558" time="0" location="/home/francois/.ivy2/cache/org.scala-lang/scala-compiler/jars/scala-compiler-2.12.7.jar">
<origin-location is-local="false" location="https://repo1.maven.org/maven2/org/scala-lang/scala-compiler/2.12.7/scala-compiler-2.12.7.jar"/>
</artifact>
</artifacts>
</revision>
</module>
<module organisation="jline" name="jline">
<revision name="2.14.6" status="release" pubdate="20180326111840" resolver="sbt-chain" artresolver="sbt-chain" homepage="" downloaded="false" searched="false" default="false" conf="master(*), compile, compile(*), master" position="4">
<license name="The BSD License" url="http://www.opensource.org/licenses/bsd-license.php"/>
<metadata-artifact status="no" details="" size="5183" time="0" location="/home/francois/.ivy2/cache/jline/jline/ivy-2.14.6.xml" searched="false" origin-is-local="false" origin-location="https://repo1.maven.org/maven2/jline/jline/2.14.6/jline-2.14.6.pom"/>
<caller organisation="org.scala-lang" name="scala-compiler" conf="optional" rev="2.14.6" rev-constraint-default="2.14.6" rev-constraint-dynamic="2.14.6" callerrev="2.12.7"/>
<artifacts>
<artifact name="jline" type="jar" ext="jar" status="no" details="" size="268780" time="0" location="/home/francois/.ivy2/cache/jline/jline/jars/jline-2.14.6.jar">
<origin-location is-local="false" location="https://repo1.maven.org/maven2/jline/jline/2.14.6/jline-2.14.6.jar"/>
</artifact>
</artifacts>
</revision>
</module>
<module organisation="org.scala-lang.modules" name="scala-xml_2.12">
<revision name="1.0.6" status="release" pubdate="20161101152105" resolver="sbt-chain" artresolver="sbt-chain" homepage="http://www.scala-lang.org/" downloaded="false" searched="false" default="false" conf="master(*), compile, runtime(*), runtime, compile(*), master" position="3">
<license name="BSD 3-clause" url="http://opensource.org/licenses/BSD-3-Clause"/>
<metadata-artifact status="no" details="" size="2987" time="0" location="/home/francois/.ivy2/cache/org.scala-lang.modules/scala-xml_2.12/ivy-1.0.6.xml" searched="false" origin-is-local="false" origin-location="https://repo1.maven.org/maven2/org/scala-lang/modules/scala-xml_2.12/1.0.6/scala-xml_2.12-1.0.6.pom"/>
<caller organisation="org.scala-lang" name="scala-compiler" conf="default, compile, runtime, optional, master" rev="1.0.6" rev-constraint-default="1.0.6" rev-constraint-dynamic="1.0.6" callerrev="2.12.7"/>
<artifacts>
<artifact name="scala-xml_2.12" type="bundle" ext="jar" status="no" details="" size="547860" time="0" location="/home/francois/.ivy2/cache/org.scala-lang.modules/scala-xml_2.12/bundles/scala-xml_2.12-1.0.6.jar">
<origin-location is-local="false" location="https://repo1.maven.org/maven2/org/scala-lang/modules/scala-xml_2.12/1.0.6/scala-xml_2.12-1.0.6.jar"/>
</artifact>
</artifacts>
</revision>
</module>
<module organisation="org.scala-lang" name="scala-reflect">
<revision name="2.12.7" status="release" pubdate="20180927103203" resolver="sbt-chain" artresolver="sbt-chain" homepage="http://www.scala-lang.org/" extra-info.apiURL="http://www.scala-lang.org/api/2.12.7/" downloaded="false" searched="false" default="false" conf="master(*), compile, runtime(*), runtime, compile(*), master" position="2">
<license name="BSD 3-Clause" url="http://www.scala-lang.org/license.html"/>
<metadata-artifact status="no" details="" size="2637" time="0" location="/home/francois/.ivy2/cache/org.scala-lang/scala-reflect/ivy-2.12.7.xml" searched="false" origin-is-local="false" origin-location="https://repo1.maven.org/maven2/org/scala-lang/scala-reflect/2.12.7/scala-reflect-2.12.7.pom"/>
<caller organisation="org.scala-lang" name="scala-compiler" conf="default, compile, runtime, optional, master" rev="2.12.7" rev-constraint-default="2.12.7" rev-constraint-dynamic="2.12.7" callerrev="2.12.7"/>
<artifacts>
<artifact name="scala-reflect" type="jar" ext="jar" status="no" details="" size="3616372" time="0" location="/home/francois/.ivy2/cache/org.scala-lang/scala-reflect/jars/scala-reflect-2.12.7.jar">
<origin-location is-local="false" location="UNKNOWN"/>
</artifact>
</artifacts>
</revision>
</module>
<module organisation="org.scala-lang" name="scala-library">
<revision name="2.12.7" status="release" pubdate="20180927103542" resolver="sbt-chain" artresolver="sbt-chain" homepage="http://www.scala-lang.org/" extra-info.apiURL="http://www.scala-lang.org/api/2.12.7/" downloaded="false" searched="false" default="false" conf="default, master(*), compile, runtime(*), runtime, optional, optional(default), compile(*), master" position="1">
<license name="BSD 3-Clause" url="http://www.scala-lang.org/license.html"/>
<metadata-artifact status="no" details="" size="2471" time="0" location="/home/francois/.ivy2/cache/org.scala-lang/scala-library/ivy-2.12.7.xml" searched="false" origin-is-local="false" origin-location="https://repo1.maven.org/maven2/org/scala-lang/scala-library/2.12.7/scala-library-2.12.7.pom"/>
<caller organisation="org.scala-lang" name="scala-compiler" conf="default, compile, runtime, optional, master" rev="2.12.7" rev-constraint-default="2.12.7" rev-constraint-dynamic="2.12.7" callerrev="2.12.7"/>
<caller organisation="org.scala-lang" name="scala-reflect" conf="compile, runtime" rev="2.12.7" rev-constraint-default="2.12.7" rev-constraint-dynamic="2.12.7" callerrev="2.12.7"/>
<caller organisation="default" name="scala-build" conf="scala-tool" rev="2.12.7" rev-constraint-default="2.12.7" rev-constraint-dynamic="2.12.7" callerrev="0.1.0-SNAPSHOT"/>
<caller organisation="org.scala-lang.modules" name="scala-xml_2.12" conf="compile, runtime" rev="2.12.7" rev-constraint-default="2.12.7" rev-constraint-dynamic="2.12.7" callerrev="1.0.6"/>
<artifacts>
<artifact name="scala-library" type="jar" ext="jar" status="no" details="" size="5277511" time="0" location="/home/francois/.ivy2/cache/org.scala-lang/scala-library/jars/scala-library-2.12.7.jar">
<origin-location is-local="false" location="UNKNOWN"/>
</artifact>
</artifacts>
</revision>
</module>
</dependencies>
</ivy-report>
This source diff could not be displayed because it is too large. You can view the blob instead.
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala-build"
revision="0.1.0-SNAPSHOT"
extra-scalaVersion="2.12"
extra-sbtVersion="1.0"
conf="test"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201516"/>
<dependencies>
</dependencies>
</ivy-report>
/*
* Licensed to the Apache Software Foundation (ASF) under one or more
* contributor license agreements. See the NOTICE file distributed with
* this work for additional information regarding copyright ownership.
* The ASF licenses this file to You under the Apache License, Version 2.0
* (the "License"); you may not use this file except in compliance with
* the License. You may obtain a copy of the License at
*
* http://www.apache.org/licenses/LICENSE-2.0
*
* Unless required by applicable law or agreed to in writing, software
* distributed under the License is distributed on an "AS IS" BASIS,
* WITHOUT WARRANTIES OR CONDITIONS OF ANY KIND, either express or implied.
* See the License for the specific language governing permissions and
* limitations under the License.
*
*/
body {
font-family:"Trebuchet MS",Verdana,Geneva,Arial,Helvetica,sans-serif;
font-size:small;
}
div#logo {
float: right;
padding-left: 10px;
padding-bottom: 10px;
background: white;
text-align: center;
}
#logo img {
border: 0;
}
div#date {
font-style: italic;
padding-left: 60px;
padding-bottom: 40px;
}
h1 {
margin-bottom:2px;
border-color:#7A9437;
border-style:solid;
border-width:0 0 3px 0;
}
span#module {
color:#7A9437;
text-decoration:none;
}
span#organisation {
color:black;
text-decoration:none;
}
#confmenu {
color: #000;
border-bottom: 2px solid black;
margin: 12px 0px 0px 0px;
padding: 0px;
z-index: 1;
padding-left: 10px
}
#confmenu li {
display: inline;
overflow: hidden;
list-style-type: none;
}
#confmenu a, a.active {
color: #DEDECF;
background: #898B5E;
font: bold 1em "Trebuchet MS", Arial, sans-serif;
border: 2px solid black;
padding: 2px 5px 0px 5px;
text-decoration: none;
}
/*
background: #ABAD85 #CED4BD
background: #DEE4CD
*/
#confmenu a.active {
color: #7A9437;
background: #DEE4CD;
border-bottom: 3px solid #DEE4CD;
}
#confmenu a:hover {
color: #fff;
background: #ADC09F;
}
#confmenu a:visited {
color: #DEDECF;
}
#confmenu a.active:visited {
color: #7A9437;
}
#confmenu a.active:hover {
background: #DEE4CD;
color: #DEDECF;
}
#content {
background: #DEE4CD;
padding: 20px;
border: 2px solid black;
border-top: none;
z-index: 2;
}
#content a {
text-decoration: none;
color: #E8E9BE;
}
#content a:hover {
background: #898B5E;
}
h2 {
margin-bottom:2px;
font-size:medium;
border-color:#7A9437;
border-style:solid;
border-width:0 0 2px 0;
}
h3 {
margin-top:30px;
margin-bottom:2px;
padding: 5 5 5 0;
font-size: 24px;
border-style:solid;
border-width:0 0 2px 0;
}
h4 {
margin-bottom:2px;
margin-top:2px;
font-size:medium;
border-color:#7A9437;
border-style:dashed;
border-width:0 0 1px 0;
}
h5 {
margin-bottom:2px;
margin-top:2px;
margin-left:20px;
font-size:medium;
}
span.resolved {
padding-left: 15px;
font-weight: 500;
font-size: small;
}
#content table {
border-collapse:collapse;
width:90%;
margin:auto;
margin-top: 5px;
}
#content thead {
background-color:#CED4BD;
border:1px solid #7A9437;
}
#content tbody {
border-collapse:collapse;
background-color:#FFFFFF;
border:1px solid #7A9437;
}
#content th {
font-family:monospace;
border:1px solid #7A9437;
padding:5px;
}
#content td {
border:1px dotted #7A9437;
padding:0 3 0 3;
}
#content table a {
color:#7A9437;
text-decoration:none;
}
#content table a:hover {
background-color:#CED4BD;
color:#7A9437;
}
table.deps {
border-collapse:collapse;
width:90%;
margin:auto;
margin-top: 5px;
}
table.deps thead {
background-color:#CED4BD;
border:1px solid #7A9437;
}
table.deps tbody {
border-collapse:collapse;
background-color:#FFFFFF;
border:1px solid #7A9437;
}
table.deps th {
font-family:monospace;
border:1px solid #7A9437;
padding:2;
}
table.deps td {
border:1px dotted #7A9437;
padding:0 3 0 3;
}
table.header {
border:0;
width:90%;
margin:auto;
margin-top: 5px;
}
table.header thead {
border:0;
}
table.header tbody {
border:0;
}
table.header tr {
padding:0px;
border:0;
}
table.header td {
padding:0 3 0 3;
border:0;
}
td.title {
width:150px;
margin-right:15px;
font-size:small;
font-weight:700;
}
td.title:first-letter {
color:#7A9437;
background-color:transparent;
}
{"{\"organization\":\"org.scala-lang\",\"name\":\"scala-library\",\"revision\":\"2.12.7\",\"configurations\":\"provided\",\"isChanging\":false,\"isTransitive\":true,\"isForce\":false,\"explicitArtifacts\":[],\"inclusions\":[],\"exclusions\":[],\"extraAttributes\":{},\"crossVersion\":{\"type\":\"Disabled\"}}":{"value":{"$fields":["path","startLine"],"path":"(sbt.Classpaths.jvmBaseSettings) Defaults.scala","startLine":2207},"type":"LinePosition"}}
\ No newline at end of file
[debug] Other repositories:
[debug] Default repositories:
[debug] Using inline dependencies specified in Scala.
[debug] Full compilation, no sources in previous analysis.
[debug] Copy resource mappings: 
[debug]  
/home/francois/.sbt/boot/scala-2.12.7/lib/scala-library.jar:/home/francois/.ivy2/cache/org.scala-sbt/sbt/jars/sbt-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/main_2.12/jars/main_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/logic_2.12/jars/logic_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/collections_2.12/jars/collections_2.12-1.2.8.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-scalajson_2.12/jars/sjson-new-scalajson_2.12-0.8.2.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-core_2.12/jars/sjson-new-core_2.12-0.8.2.jar:/home/francois/.ivy2/cache/com.eed3si9n/shaded-scalajson_2.12/jars/shaded-scalajson_2.12-1.0.0-M4.jar:/home/francois/.ivy2/cache/org.spire-math/jawn-parser_2.12/jars/jawn-parser_2.12-0.10.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-position_2.12/jars/util-position_2.12-1.2.4.jar:/home/francois/.sbt/boot/scala-2.12.7/lib/scala-reflect.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-relation_2.12/jars/util-relation_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/actions_2.12/jars/actions_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/completion_2.12/jars/completion_2.12-1.2.8.jar:/home/francois/.ivy2/cache/jline/jline/jars/jline-2.14.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/io_2.12/jars/io_2.12-1.2.2.jar:/home/francois/.ivy2/cache/com.swoval/apple-file-events/jars/apple-file-events-1.3.2.jar:/home/francois/.ivy2/cache/net.java.dev.jna/jna/jars/jna-4.5.0.jar:/home/francois/.ivy2/cache/net.java.dev.jna/jna-platform/jars/jna-platform-4.5.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-control_2.12/jars/util-control_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/run_2.12/jars/run_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-logging_2.12/jars/util-logging_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-interface/jars/util-interface-1.2.4.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-api/jars/log4j-api-2.11.1.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-core/jars/log4j-core-2.11.1.jar:/home/francois/.ivy2/cache/com.lmax/disruptor/jars/disruptor-3.4.2.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-classpath_2.12/jars/zinc-classpath_2.12-1.2.5.jar:/home/francois/.sbt/boot/scala-2.12.7/lib/scala-compiler.jar:/home/francois/.ivy2/cache/org.scala-lang.modules/scala-xml_2.12/bundles/scala-xml_2.12-1.0.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/compiler-interface/jars/compiler-interface-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/launcher-interface/jars/launcher-interface-1.0.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/task-system_2.12/jars/task-system_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/tasks_2.12/jars/tasks_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-cache_2.12/jars/util-cache_2.12-1.2.4.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-murmurhash_2.12/jars/sjson-new-murmurhash_2.12-0.8.2.jar:/home/francois/.ivy2/cache/org.scala-sbt/testing_2.12/jars/testing_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/test-agent/jars/test-agent-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/test-interface/jars/test-interface-1.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-tracking_2.12/jars/util-tracking_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-apiinfo_2.12/jars/zinc-apiinfo_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/compiler-bridge_2.12/jars/compiler-bridge_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-classfile_2.12/jars/zinc-classfile_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/librarymanagement-core_2.12/jars/librarymanagement-core_2.12-1.2.4.jar:/home/francois/.ivy2/cache/com.jcraft/jsch/jars/jsch-0.1.54.jar:/home/francois/.ivy2/cache/com.eed3si9n/gigahorse-okhttp_2.12/jars/gigahorse-okhttp_2.12-0.3.0.jar:/home/francois/.ivy2/cache/com.eed3si9n/gigahorse-core_2.12/jars/gigahorse-core_2.12-0.3.0.jar:/home/francois/.ivy2/cache/com.typesafe/ssl-config-core_2.12/bundles/ssl-config-core_2.12-0.2.2.jar:/home/francois/.ivy2/cache/com.typesafe/config/bundles/config-1.2.0.jar:/home/francois/.ivy2/cache/org.reactivestreams/reactive-streams/jars/reactive-streams-1.0.0.jar:/home/francois/.ivy2/cache/org.slf4j/slf4j-api/jars/slf4j-api-1.7.25.jar:/home/francois/.ivy2/cache/com.squareup.okhttp3/okhttp/jars/okhttp-3.7.0.jar:/home/francois/.ivy2/cache/com.squareup.okio/okio/jars/okio-1.12.0.jar:/home/francois/.ivy2/cache/com.squareup.okhttp3/okhttp-urlconnection/jars/okhttp-urlconnection-3.7.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-ivy-integration_2.12/jars/zinc-ivy-integration_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-compile-core_2.12/jars/zinc-compile-core_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-lang.modules/scala-parser-combinators_2.12/bundles/scala-parser-combinators_2.12-1.0.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc_2.12/jars/zinc_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-core_2.12/jars/zinc-core_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-persist_2.12/jars/zinc-persist_2.12-1.2.5.jar:/home/francois/.ivy2/cache/com.trueaccord.scalapb/scalapb-runtime_2.12/jars/scalapb-runtime_2.12-0.6.0.jar:/home/francois/.ivy2/cache/com.trueaccord.lenses/lenses_2.12/jars/lenses_2.12-0.4.12.jar:/home/francois/.ivy2/cache/com.lihaoyi/fastparse_2.12/jars/fastparse_2.12-0.4.2.jar:/home/francois/.ivy2/cache/com.lihaoyi/fastparse-utils_2.12/jars/fastparse-utils_2.12-0.4.2.jar:/home/francois/.ivy2/cache/com.lihaoyi/sourcecode_2.12/jars/sourcecode_2.12-0.1.3.jar:/home/francois/.ivy2/cache/com.google.protobuf/protobuf-java/bundles/protobuf-java-3.3.1.jar:/home/francois/.ivy2/cache/org.scala-sbt/sbinary_2.12/jars/sbinary_2.12-0.5.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/main-settings_2.12/jars/main-settings_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/command_2.12/jars/command_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/protocol_2.12/jars/protocol_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt.ipcsocket/ipcsocket/jars/ipcsocket-1.0.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/template-resolver/jars/template-resolver-0.1.jar:/home/francois/.ivy2/cache/org.scala-sbt/core-macros_2.12/jars/core-macros_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/scripted-sbt-redux_2.12/jars/scripted-sbt-redux_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-scripted_2.12/jars/util-scripted_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/scripted-plugin_2.12/jars/scripted-plugin_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-slf4j-impl/jars/log4j-slf4j-impl-2.11.1.jar:/home/francois/.ivy2/cache/com.github.cb372/scalacache-caffeine_2.12/jars/scalacache-caffeine_2.12-0.20.0.jar:/home/francois/.ivy2/cache/com.github.cb372/scalacache-core_2.12/jars/scalacache-core_2.12-0.20.0.jar:/home/francois/.ivy2/cache/com.github.ben-manes.caffeine/caffeine/jars/caffeine-2.5.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/librarymanagement-ivy_2.12/jars/librarymanagement-ivy_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt.ivy/ivy/jars/ivy-2.3.0-sbt-cb9cc189e9f3af519f9f102e6c5d446488ff6832.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-compile_2.12/jars/zinc-compile_2.12-1.2.5.jar
/home/francois/Bureau/electra/electra2-form-exploration/scala/project/target/scala-2.12/sbt-1.0/classes
/home/francois/.sbt/boot/scala-2.12.7/lib/scala-library.jar:/home/francois/.ivy2/cache/org.scala-sbt/sbt/jars/sbt-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/main_2.12/jars/main_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/logic_2.12/jars/logic_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/collections_2.12/jars/collections_2.12-1.2.8.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-scalajson_2.12/jars/sjson-new-scalajson_2.12-0.8.2.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-core_2.12/jars/sjson-new-core_2.12-0.8.2.jar:/home/francois/.ivy2/cache/com.eed3si9n/shaded-scalajson_2.12/jars/shaded-scalajson_2.12-1.0.0-M4.jar:/home/francois/.ivy2/cache/org.spire-math/jawn-parser_2.12/jars/jawn-parser_2.12-0.10.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-position_2.12/jars/util-position_2.12-1.2.4.jar:/home/francois/.sbt/boot/scala-2.12.7/lib/scala-reflect.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-relation_2.12/jars/util-relation_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/actions_2.12/jars/actions_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/completion_2.12/jars/completion_2.12-1.2.8.jar:/home/francois/.ivy2/cache/jline/jline/jars/jline-2.14.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/io_2.12/jars/io_2.12-1.2.2.jar:/home/francois/.ivy2/cache/com.swoval/apple-file-events/jars/apple-file-events-1.3.2.jar:/home/francois/.ivy2/cache/net.java.dev.jna/jna/jars/jna-4.5.0.jar:/home/francois/.ivy2/cache/net.java.dev.jna/jna-platform/jars/jna-platform-4.5.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-control_2.12/jars/util-control_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/run_2.12/jars/run_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-logging_2.12/jars/util-logging_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-interface/jars/util-interface-1.2.4.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-api/jars/log4j-api-2.11.1.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-core/jars/log4j-core-2.11.1.jar:/home/francois/.ivy2/cache/com.lmax/disruptor/jars/disruptor-3.4.2.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-classpath_2.12/jars/zinc-classpath_2.12-1.2.5.jar:/home/francois/.sbt/boot/scala-2.12.7/lib/scala-compiler.jar:/home/francois/.ivy2/cache/org.scala-lang.modules/scala-xml_2.12/bundles/scala-xml_2.12-1.0.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/compiler-interface/jars/compiler-interface-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/launcher-interface/jars/launcher-interface-1.0.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/task-system_2.12/jars/task-system_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/tasks_2.12/jars/tasks_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-cache_2.12/jars/util-cache_2.12-1.2.4.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-murmurhash_2.12/jars/sjson-new-murmurhash_2.12-0.8.2.jar:/home/francois/.ivy2/cache/org.scala-sbt/testing_2.12/jars/testing_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/test-agent/jars/test-agent-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/test-interface/jars/test-interface-1.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-tracking_2.12/jars/util-tracking_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-apiinfo_2.12/jars/zinc-apiinfo_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/compiler-bridge_2.12/jars/compiler-bridge_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-classfile_2.12/jars/zinc-classfile_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/librarymanagement-core_2.12/jars/librarymanagement-core_2.12-1.2.4.jar:/home/francois/.ivy2/cache/com.jcraft/jsch/jars/jsch-0.1.54.jar:/home/francois/.ivy2/cache/com.eed3si9n/gigahorse-okhttp_2.12/jars/gigahorse-okhttp_2.12-0.3.0.jar:/home/francois/.ivy2/cache/com.eed3si9n/gigahorse-core_2.12/jars/gigahorse-core_2.12-0.3.0.jar:/home/francois/.ivy2/cache/com.typesafe/ssl-config-core_2.12/bundles/ssl-config-core_2.12-0.2.2.jar:/home/francois/.ivy2/cache/com.typesafe/config/bundles/config-1.2.0.jar:/home/francois/.ivy2/cache/org.reactivestreams/reactive-streams/jars/reactive-streams-1.0.0.jar:/home/francois/.ivy2/cache/org.slf4j/slf4j-api/jars/slf4j-api-1.7.25.jar:/home/francois/.ivy2/cache/com.squareup.okhttp3/okhttp/jars/okhttp-3.7.0.jar:/home/francois/.ivy2/cache/com.squareup.okio/okio/jars/okio-1.12.0.jar:/home/francois/.ivy2/cache/com.squareup.okhttp3/okhttp-urlconnection/jars/okhttp-urlconnection-3.7.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-ivy-integration_2.12/jars/zinc-ivy-integration_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-compile-core_2.12/jars/zinc-compile-core_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-lang.modules/scala-parser-combinators_2.12/bundles/scala-parser-combinators_2.12-1.0.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc_2.12/jars/zinc_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-core_2.12/jars/zinc-core_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-persist_2.12/jars/zinc-persist_2.12-1.2.5.jar:/home/francois/.ivy2/cache/com.trueaccord.scalapb/scalapb-runtime_2.12/jars/scalapb-runtime_2.12-0.6.0.jar:/home/francois/.ivy2/cache/com.trueaccord.lenses/lenses_2.12/jars/lenses_2.12-0.4.12.jar:/home/francois/.ivy2/cache/com.lihaoyi/fastparse_2.12/jars/fastparse_2.12-0.4.2.jar:/home/francois/.ivy2/cache/com.lihaoyi/fastparse-utils_2.12/jars/fastparse-utils_2.12-0.4.2.jar:/home/francois/.ivy2/cache/com.lihaoyi/sourcecode_2.12/jars/sourcecode_2.12-0.1.3.jar:/home/francois/.ivy2/cache/com.google.protobuf/protobuf-java/bundles/protobuf-java-3.3.1.jar:/home/francois/.ivy2/cache/org.scala-sbt/sbinary_2.12/jars/sbinary_2.12-0.5.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/main-settings_2.12/jars/main-settings_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/command_2.12/jars/command_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/protocol_2.12/jars/protocol_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt.ipcsocket/ipcsocket/jars/ipcsocket-1.0.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/template-resolver/jars/template-resolver-0.1.jar:/home/francois/.ivy2/cache/org.scala-sbt/core-macros_2.12/jars/core-macros_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/scripted-sbt-redux_2.12/jars/scripted-sbt-redux_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-scripted_2.12/jars/util-scripted_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/scripted-plugin_2.12/jars/scripted-plugin_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-slf4j-impl/jars/log4j-slf4j-impl-2.11.1.jar:/home/francois/.ivy2/cache/com.github.cb372/scalacache-caffeine_2.12/jars/scalacache-caffeine_2.12-0.20.0.jar:/home/francois/.ivy2/cache/com.github.cb372/scalacache-core_2.12/jars/scalacache-core_2.12-0.20.0.jar:/home/francois/.ivy2/cache/com.github.ben-manes.caffeine/caffeine/jars/caffeine-2.5.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/librarymanagement-ivy_2.12/jars/librarymanagement-ivy_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt.ivy/ivy/jars/ivy-2.3.0-sbt-cb9cc189e9f3af519f9f102e6c5d446488ff6832.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-compile_2.12/jars/zinc-compile_2.12-1.2.5.jar
/home/francois/.sbt/boot/scala-2.12.7/lib/scala-library.jar:/home/francois/.ivy2/cache/org.scala-sbt/sbt/jars/sbt-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/main_2.12/jars/main_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/logic_2.12/jars/logic_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/collections_2.12/jars/collections_2.12-1.2.8.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-scalajson_2.12/jars/sjson-new-scalajson_2.12-0.8.2.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-core_2.12/jars/sjson-new-core_2.12-0.8.2.jar:/home/francois/.ivy2/cache/com.eed3si9n/shaded-scalajson_2.12/jars/shaded-scalajson_2.12-1.0.0-M4.jar:/home/francois/.ivy2/cache/org.spire-math/jawn-parser_2.12/jars/jawn-parser_2.12-0.10.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-position_2.12/jars/util-position_2.12-1.2.4.jar:/home/francois/.sbt/boot/scala-2.12.7/lib/scala-reflect.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-relation_2.12/jars/util-relation_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/actions_2.12/jars/actions_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/completion_2.12/jars/completion_2.12-1.2.8.jar:/home/francois/.ivy2/cache/jline/jline/jars/jline-2.14.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/io_2.12/jars/io_2.12-1.2.2.jar:/home/francois/.ivy2/cache/com.swoval/apple-file-events/jars/apple-file-events-1.3.2.jar:/home/francois/.ivy2/cache/net.java.dev.jna/jna/jars/jna-4.5.0.jar:/home/francois/.ivy2/cache/net.java.dev.jna/jna-platform/jars/jna-platform-4.5.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-control_2.12/jars/util-control_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/run_2.12/jars/run_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-logging_2.12/jars/util-logging_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-interface/jars/util-interface-1.2.4.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-api/jars/log4j-api-2.11.1.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-core/jars/log4j-core-2.11.1.jar:/home/francois/.ivy2/cache/com.lmax/disruptor/jars/disruptor-3.4.2.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-classpath_2.12/jars/zinc-classpath_2.12-1.2.5.jar:/home/francois/.sbt/boot/scala-2.12.7/lib/scala-compiler.jar:/home/francois/.ivy2/cache/org.scala-lang.modules/scala-xml_2.12/bundles/scala-xml_2.12-1.0.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/compiler-interface/jars/compiler-interface-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/launcher-interface/jars/launcher-interface-1.0.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/task-system_2.12/jars/task-system_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/tasks_2.12/jars/tasks_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-cache_2.12/jars/util-cache_2.12-1.2.4.jar:/home/francois/.ivy2/cache/com.eed3si9n/sjson-new-murmurhash_2.12/jars/sjson-new-murmurhash_2.12-0.8.2.jar:/home/francois/.ivy2/cache/org.scala-sbt/testing_2.12/jars/testing_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/test-agent/jars/test-agent-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/test-interface/jars/test-interface-1.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-tracking_2.12/jars/util-tracking_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-apiinfo_2.12/jars/zinc-apiinfo_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/compiler-bridge_2.12/jars/compiler-bridge_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-classfile_2.12/jars/zinc-classfile_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/librarymanagement-core_2.12/jars/librarymanagement-core_2.12-1.2.4.jar:/home/francois/.ivy2/cache/com.jcraft/jsch/jars/jsch-0.1.54.jar:/home/francois/.ivy2/cache/com.eed3si9n/gigahorse-okhttp_2.12/jars/gigahorse-okhttp_2.12-0.3.0.jar:/home/francois/.ivy2/cache/com.eed3si9n/gigahorse-core_2.12/jars/gigahorse-core_2.12-0.3.0.jar:/home/francois/.ivy2/cache/com.typesafe/ssl-config-core_2.12/bundles/ssl-config-core_2.12-0.2.2.jar:/home/francois/.ivy2/cache/com.typesafe/config/bundles/config-1.2.0.jar:/home/francois/.ivy2/cache/org.reactivestreams/reactive-streams/jars/reactive-streams-1.0.0.jar:/home/francois/.ivy2/cache/org.slf4j/slf4j-api/jars/slf4j-api-1.7.25.jar:/home/francois/.ivy2/cache/com.squareup.okhttp3/okhttp/jars/okhttp-3.7.0.jar:/home/francois/.ivy2/cache/com.squareup.okio/okio/jars/okio-1.12.0.jar:/home/francois/.ivy2/cache/com.squareup.okhttp3/okhttp-urlconnection/jars/okhttp-urlconnection-3.7.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-ivy-integration_2.12/jars/zinc-ivy-integration_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-compile-core_2.12/jars/zinc-compile-core_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-lang.modules/scala-parser-combinators_2.12/bundles/scala-parser-combinators_2.12-1.0.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc_2.12/jars/zinc_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-core_2.12/jars/zinc-core_2.12-1.2.5.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-persist_2.12/jars/zinc-persist_2.12-1.2.5.jar:/home/francois/.ivy2/cache/com.trueaccord.scalapb/scalapb-runtime_2.12/jars/scalapb-runtime_2.12-0.6.0.jar:/home/francois/.ivy2/cache/com.trueaccord.lenses/lenses_2.12/jars/lenses_2.12-0.4.12.jar:/home/francois/.ivy2/cache/com.lihaoyi/fastparse_2.12/jars/fastparse_2.12-0.4.2.jar:/home/francois/.ivy2/cache/com.lihaoyi/fastparse-utils_2.12/jars/fastparse-utils_2.12-0.4.2.jar:/home/francois/.ivy2/cache/com.lihaoyi/sourcecode_2.12/jars/sourcecode_2.12-0.1.3.jar:/home/francois/.ivy2/cache/com.google.protobuf/protobuf-java/bundles/protobuf-java-3.3.1.jar:/home/francois/.ivy2/cache/org.scala-sbt/sbinary_2.12/jars/sbinary_2.12-0.5.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/main-settings_2.12/jars/main-settings_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/command_2.12/jars/command_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/protocol_2.12/jars/protocol_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt.ipcsocket/ipcsocket/jars/ipcsocket-1.0.0.jar:/home/francois/.ivy2/cache/org.scala-sbt/template-resolver/jars/template-resolver-0.1.jar:/home/francois/.ivy2/cache/org.scala-sbt/core-macros_2.12/jars/core-macros_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/scripted-sbt-redux_2.12/jars/scripted-sbt-redux_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.scala-sbt/util-scripted_2.12/jars/util-scripted_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt/scripted-plugin_2.12/jars/scripted-plugin_2.12-1.2.8.jar:/home/francois/.ivy2/cache/org.apache.logging.log4j/log4j-slf4j-impl/jars/log4j-slf4j-impl-2.11.1.jar:/home/francois/.ivy2/cache/com.github.cb372/scalacache-caffeine_2.12/jars/scalacache-caffeine_2.12-0.20.0.jar:/home/francois/.ivy2/cache/com.github.cb372/scalacache-core_2.12/jars/scalacache-core_2.12-0.20.0.jar:/home/francois/.ivy2/cache/com.github.ben-manes.caffeine/caffeine/jars/caffeine-2.5.6.jar:/home/francois/.ivy2/cache/org.scala-sbt/librarymanagement-ivy_2.12/jars/librarymanagement-ivy_2.12-1.2.4.jar:/home/francois/.ivy2/cache/org.scala-sbt.ivy/ivy/jars/ivy-2.3.0-sbt-cb9cc189e9f3af519f9f102e6c5d446488ff6832.jar:/home/francois/.ivy2/cache/org.scala-sbt/zinc-compile_2.12/jars/zinc-compile_2.12-1.2.5.jar
/home/francois/Bureau/electra/electra2-form-exploration/scala/project/target/scala-2.12/sbt-1.0/classes
/home/francois/Bureau/electra/electra2-form-exploration/scala/project/target/scala-2.12/sbt-1.0/classes
/home/francois/Bureau/electra/electra2-form-exploration/scala/project/target/scala-2.12/sbt-1.0/classes
/home/francois/Bureau/electra/electra2-form-exploration/scala/project/target/scala-2.12/sbt-1.0/classes
This diff is collapsed.
;set _root_.scala.collection.Seq(shellPrompt := { _ => "" },SettingKey[_root_.scala.Option[_root_.sbt.File]]("sbtStructureOutputFile") in _root_.sbt.Global := _root_.scala.Some(_root_.sbt.file("/tmp/sbt-structure.xml")),SettingKey[_root_.java.lang.String]("sbtStructureOptions") in _root_.sbt.Global := "download, resolveClassifiers");apply -cp "/home/francois/.IdeaIC2017.3/config/plugins/Scala/launcher/sbt-structure-1.0.jar" org.jetbrains.sbt.CreateTasks;*/*:dumpStructure
exit
run
#default#scala$sources;0.1 resolved revisions
#Mon Jul 22 20:16:16 CEST 2019
+organisation\:\#@\#\:+org.scala-lang\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+scala-reflect\:\#@\#\:+revision\:\#@\#\:+2.13.0\:\#@\#\:+info.apiURL\:\#@\#\:+https\://www.scala-lang.org/api/2.13.0/\:\#@\#\:=2.13.0 ? 2.13.0 null
+organisation\:\#@\#\:+jline\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+jline\:\#@\#\:+revision\:\#@\#\:+2.14.6\:\#@\#\:=2.14.6 release 2.14.6 null
+organisation\:\#@\#\:+org.scala-lang\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+scala-compiler\:\#@\#\:+revision\:\#@\#\:+2.13.0\:\#@\#\:=2.13.0 release 2.13.0 null
+organisation\:\#@\#\:+org.scala-lang\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+scala-library\:\#@\#\:+revision\:\#@\#\:+2.13.0\:\#@\#\:+info.apiURL\:\#@\#\:+https\://www.scala-lang.org/api/2.13.0/\:\#@\#\:=2.13.0 ? 2.13.0 null
<?xml version="1.0" encoding="UTF-8"?>
<ivy-module version="2.0" xmlns:e="http://ant.apache.org/ivy/extra">
<info organisation="default"
module="scala$sources"
revision="0.1"
status="integration"
publication="20190722201616"
/>
<configurations>
<conf name="compile" visibility="public" description=""/>
<conf name="runtime" visibility="public" description="" extends="compile"/>
<conf name="test" visibility="public" description="" extends="runtime"/>
<conf name="provided" visibility="public" description=""/>
<conf name="optional" visibility="public" description=""/>
<conf name="compile-internal" visibility="private" description="" extends="compile,optional,provided"/>
<conf name="runtime-internal" visibility="private" description="" extends="runtime,optional"/>
<conf name="test-internal" visibility="private" description="" extends="test,optional,provided"/>
<conf name="plugin" visibility="private" description=""/>
<conf name="pom" visibility="public" description=""/>
<conf name="scala-tool" visibility="private" description=""/>
</configurations>
<publications>
</publications>
<dependencies>
<dependency org="org.scala-lang" name="scala-compiler" rev="2.13.0" transitive="false" conf="scala-tool->default,compile,runtime,optional,optional(default),master">
<artifact name="scala-compiler" type="src" ext="jar" conf="*" e:classifier="sources"/>
<include name="*" type="*" ext="*" conf="" matcher="exact"/>
</dependency>
<dependency org="org.scala-lang" name="scala-reflect" rev="2.13.0" transitive="false" conf="scala-tool->compile,runtime(*),master(compile),runtime,compile(*),master" info.apiURL="https://www.scala-lang.org/api/2.13.0/">
<artifact name="scala-reflect" type="src" ext="jar" conf="*" e:classifier="sources"/>
<include name="*" type="*" ext="*" conf="" matcher="exact"/>
</dependency>
<dependency org="jline" name="jline" rev="2.14.6" transitive="false" conf="scala-tool->compile,runtime(*),master(compile),runtime,compile(*),master">
<artifact name="jline" type="src" ext="jar" conf="*" e:classifier="sources"/>
<include name="*" type="*" ext="*" conf="" matcher="exact"/>
</dependency>
<dependency org="org.scala-lang" name="scala-library" rev="2.13.0" transitive="false" conf="compile->default,compile,runtime,default(compile),master;runtime->default,compile,runtime,default(compile),master;test->default,compile,runtime,default(compile),master;compile-internal->default,compile,runtime,default(compile),master;runtime-internal->default,compile,runtime,default(compile),master;test-internal->default,compile,runtime,default(compile),master;scala-tool->default,compile,runtime(*),master(compile),runtime,optional,optional(default),compile(*),master" info.apiURL="https://www.scala-lang.org/api/2.13.0/">
<artifact name="scala-library" type="src" ext="jar" conf="*" e:classifier="sources"/>
<include name="*" type="*" ext="*" conf="" matcher="exact"/>
</dependency>
</dependencies>
</ivy-module>
#default#scala_2.13;0.1 resolved revisions
#Mon Jul 22 20:15:30 CEST 2019
+organisation\:\#@\#\:+org.scala-lang\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+scala-compiler\:\#@\#\:+revision\:\#@\#\:+2.13.0\:\#@\#\:=2.13.0 release 2.13.0 null
+organisation\:\#@\#\:+org.scala-lang\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+scala-library\:\#@\#\:+revision\:\#@\#\:+2.13.0\:\#@\#\:=2.13.0 ? 2.13.0 null
<?xml version="1.0" encoding="UTF-8"?>
<ivy-module version="2.0" xmlns:e="http://ant.apache.org/ivy/extra">
<info organisation="default"
module="scala_2.13"
revision="0.1"
status="integration"
publication="20190722201527"
>
<description>
scala
</description>
</info>
<configurations>
<conf name="compile" visibility="public" description=""/>
<conf name="runtime" visibility="public" description="" extends="compile"/>
<conf name="test" visibility="public" description="" extends="runtime"/>
<conf name="provided" visibility="public" description=""/>
<conf name="optional" visibility="public" description=""/>
<conf name="compile-internal" visibility="private" description="" extends="compile,optional,provided"/>
<conf name="runtime-internal" visibility="private" description="" extends="runtime,optional"/>
<conf name="test-internal" visibility="private" description="" extends="test,optional,provided"/>
<conf name="plugin" visibility="private" description=""/>
<conf name="pom" visibility="public" description=""/>
<conf name="scala-tool" visibility="private" description=""/>
</configurations>
<publications>
<artifact name="scala_2.13" type="pom" ext="pom" conf="pom"/>
<artifact name="scala_2.13" type="jar" ext="jar" conf="compile"/>
<artifact name="scala_2.13" type="src" ext="jar" conf="compile" e:classifier="sources"/>
<artifact name="scala_2.13" type="doc" ext="jar" conf="compile" e:classifier="javadoc"/>
</publications>
<dependencies>
<dependency org="org.scala-lang" name="scala-compiler" rev="2.13.0" conf="scala-tool->default,optional(default)"/>
<dependency org="org.scala-lang" name="scala-library" rev="2.13.0" conf="scala-tool->default,optional(default);compile->default(compile)"/>
</dependencies>
</ivy-module>
#org.scala-sbt.temp#temp-module-52f238aede5a1d8d7a484c2bec27a144810e2ac0;1.2.5 resolved revisions
#Mon Jul 22 22:49:38 CEST 2019
+organisation\:\#@\#\:+org.scala-sbt\:\#@\#\:+branch\:\#@\#\:+@\#\:NULL\:\#@\:\#@\#\:+module\:\#@\#\:+compiler-bridge_2.13\:\#@\#\:+revision\:\#@\#\:+1.2.5\:\#@\#\:=1.2.5 release 1.2.5 null
<?xml version="1.0" encoding="UTF-8"?>
<ivy-module version="2.0" xmlns:e="http://ant.apache.org/ivy/extra">
<info organisation="org.scala-sbt.temp"
module="temp-module-52f238aede5a1d8d7a484c2bec27a144810e2ac0"
revision="1.2.5"
status="integration"
publication="20190722224936"
/>
<configurations>
<conf name="compile" visibility="public" description=""/>
<conf name="runtime" visibility="public" description="" extends="compile"/>
<conf name="test" visibility="public" description="" extends="runtime"/>
<conf name="provided" visibility="public" description=""/>
<conf name="optional" visibility="public" description=""/>
</configurations>
<publications>
</publications>
<dependencies>
<dependency org="org.scala-sbt" name="compiler-bridge_2.13" rev="1.2.5" conf="compile->default(compile)">
<artifact name="compiler-bridge_2.13" type="src" ext="jar" conf="*" e:classifier="sources"/>
</dependency>
</dependencies>
</ivy-module>
<?xml version="1.0" encoding="UTF-8"?>
<?xml-stylesheet type="text/xsl" href="ivy-report.xsl"?>
<ivy-report version="1.0">
<info
organisation="default"
module="scala$sources"
revision="0.1"
conf="compile-internal"
confs="compile, runtime, test, provided, optional, compile-internal, runtime-internal, test-internal, plugin, pom, scala-tool"
date="20190722201616"/>
<dependencies>
<module organisation="org.scala-lang" name="scala-library">
<revision name="2.13.0" status="release" pubdate="20190607130246" resolver="sbt-chain" artresolver="sbt-chain" homepage="https://www.scala-lang.org/" extra-info.apiURL="https://www.scala-lang.org/api/2.13.0/" downloaded="false" searched="false" default="false" conf="default, compile, runtime, default(compile), master" position="0">
<license name="Apache-2.0" url="https://www.apache.org/licenses/LICENSE-2.0"/>
<metadata-artifact status="no" details="" size="2659" time="0" location="/home/francois/.ivy2/cache/org.scala-lang/scala-library/ivy-2.13.0.xml" searched="false" origin-is-local="false" origin-location="https://repo1.maven.org/maven2/org/scala-lang/scala-library/2.13.0/scala-library-2.13.0.pom"/>
<caller organisation="default" name="scala$sources" conf="compile-internal, compile, provided, optional" rev="2.13.0" rev-constraint-default="2.13.0" rev-constraint-dynamic="2.13.0" callerrev="0.1" extra-info.apiURL="https://www.scala-lang.org/api/2.13.0/"/>
<artifacts>
<artifact name="scala-library" type="src" ext="jar" extra-classifier="sources" status="successful" details="" size="990929" time="7890" location="/home/francois/.ivy2/cache/org.scala-lang/scala-library/srcs/scala-library-2.13.0-sources.jar">
<origin-location is-local="false" location="https://repo1.maven.org/maven2/org/scala-lang/scala-library/2.13.0/scala-library-2.13.0-sources.jar"/>
</artifact>
</artifacts>
</revision>
</module>
</dependencies>
</ivy-report>
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
This diff is collapsed.
Markdown is supported
0% or
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment