必要なパッケージ

require(Rtsne)
require(TSP)

はじめに

ここでは、Rを用いて連鎖解析、連鎖地図作成について説明する。具体的には、分離比検定、連鎖の検定、組換え価の推定、地図距離への変換、連鎖群への分割、連鎖群毎の遺伝子座の並び替えを行う。基礎的ではあるが分子マーカーを用いた様々な解析を支える解析である。

データの読み込み

マーカー遺伝子型のデータを読み込む。

geno <- read.csv("geno.csv", row.names = 1)

読み込んだデータのサイズを確認する。

dim(geno)
## [1] 150 495

1つ目のマーカー遺伝子座について、マーカー遺伝子型の分割表を作成する。

tt <- table(geno[,1])
tt
## 
##  A  B 
## 73 68

ほぼ均等である。この集団(倍加半数体集団)では、AA型とBB型が1:1に分離すると期待される。 分離比を検定する。分割表をchisq.test関数で検定すれば良い。

res <- chisq.test(tt)
res
## 
##  Chi-squared test for given probabilities
## 
## data:  tt
## X-squared = 0.1773, df = 1, p-value = 0.6737

結果からp値を取り出す

names(res) # いろいろな名前がついた結果がある
## [1] "statistic" "parameter" "p.value"   "method"    "data.name" "observed" 
## [7] "expected"  "residuals" "stdres"

p.valueというのが、p値が格納されている変数。

res$p.value # そのうち、p.valueという結果を表示する
## [1] 0.6736996

次に、1つ目と2つ目のマーカー遺伝子座についての遺伝子型の二元分割表を作成する。

tt <- table(geno[, c(1,2)])
tt
##     MWG938
## Hor5  A  B
##    A 72  1
##    B  0 68

独立性(連鎖)を検定する。二元分割表をchisq.test関数で検定すれば良い。

chisq.test(tt)
## 
##  Pearson's Chi-squared test with Yates' continuity correction
## 
## data:  tt
## X-squared = 133.13, df = 1, p-value < 2.2e-16

ttの中身を改めてよく考えてよう。ttの対角成分は非組換え型の数である。

diag(tt)
##  A  B 
## 72 68

したがって、その和をとると、非組換え型の総数を求めることができる。

sum(diag(tt))
## [1] 140

組換え型の総数は、ttの総和から、非組換え型の総数を減ずれば良い。

sum(tt) - sum(diag(tt))
## [1] 1

したがって、組換え価(全配偶子分の組換え型の割合)を求めるには次のようにすれば良い。

(sum(tt) - sum(diag(tt))) / sum(tt)
## [1] 0.007092199

これは、1番目のマーカーと2番目のマーカーの組換え価である。

組換え価を全ての組合せについて計算する。その前に、全ての組合せについての組換え価を代入するための入れ物を準備しておく。

rmat <- matrix(NA, ncol(geno), ncol(geno))

準備しておいた入れ物に組換え価を代入していく。 for文の使い方に注意する。iを1〜マーカー数分回すループの中に、jをi〜マーカー数分回すループを入れてある。 こうすることで、n * (n - 1) / 2回の計算で済むようにしてある。

for(i in 1:ncol(geno)) {
    for(j in i:ncol(geno)) {
        tt <- table(geno[, c(i, j)])
        rmat[i, j] <- (sum(tt) - sum(diag(tt))) / sum(tt)
        rmat[j, i] <- rmat[i, j]
    }
}

行と列にマーカー名を代入しておく。

colnames(rmat) <- rownames(rmat) <- colnames(geno)

組換え価には加法性が無い。 これは、A-B-Cと並んでいるマーカーがあった場合に、 例えば、A-BおよびB-Cで組換えが起こると、A-C間では組換えが起こらないので、 AC間の組換え価r_ACが、AB間の組換え価r_ABとBC間の組換え価r_BCの和にならない ためである。

いっぽう、地図を作成するには加法性のある尺度が必要である。 そこで、連鎖地図を作成する前に、加法性のない組換え価を、加法性のある地図距離に変換する。 地図距離にはいくつかあるが、ここでは、Haldaneの地図関数を計算する。 r = 0〜0.5に対してHaldaneの地図関数を用いて地図距離を計算して、その結果をプロットする。

r <- seq(0, 0.5, 0.001)
d.haldane <- -log(1 - 2 * r) / 2
d.kosambi <- log((1 + 2 * r) / (1 - 2 * r)) / 4
plot(d.haldane, r, type = "l", col = "blue")
points(d.kosambi, r, type = "l", col = "red")
abline(0, 1, col = "green", lty = 2)
abline(h  = 0.5, lty = 2)

この地図距離の単位はモルガンMである。 地図距離には通常cM(センチモルガンが使われる)。 100倍すれば良い。 地図関数を用いて組換え価を地図距離に変換する。 組換え価を代入しておいたrmatについて、一挙に変換を行う。 100倍してモルガンではなくcMを単位にする。ここではKosambi関数を用いる。

#dmat <- -log(1 - 2 * rmat) / 2 * 100 # Haldane
dmat <- log((1 + 2 * rmat) / (1 - 2 * rmat)) / 4 * 100 # Kosambi
## Warning in log((1 + 2 * rmat)/(1 - 2 * rmat)): 計算結果が NaN になりました

ただし、上のコマンドではWarningが表示される。 これは、確率的なゆらぎから組換え価が0.5を超える場合があり、 その場合にlogの中身が負になってしまうためである。 対数が計算されていない、あるいは、-無限大になってしまったものに10000を代入する。 10000cM = 100Mであり、それほど長い染色体はまず存在しない。

dmat[is.nan(dmat)] <- 10000
dmat[dmat == Inf] <- 10000

クラスタ解析を行って連鎖群に分類する。手法には、single linkage methodを使う。 それが何故であるかは、いくつかの方法を実際に試してみて、考察してほしい。

tre <- hclust(as.dist(dmat), method = "single")
plot(tre, label = F)

オオムギの基本染色体数は2n = 14。したがって、7つの連鎖群に分類されるはず。 cutree関数は、階層的クラスタリングの結果に基づき決まった数(今は7)に分類する方法。

plot(tre, label = F)
rect.hclust(tre, k = 7)

得られた7つのグループのIDを得る。

lg <- cutree(tre, k = 7)

tSNEを用いて2次元で表示し、グループIDで色塗りをしてみる。

res <- Rtsne(dmat, is_distance = T, dims = 2, perplexity = 20)
plot(res$Y, col = lg)

なお、実際には、これらマーカーは既にマップされているので、その結果を読み込んで答え合わせを行ってみる。 map.csvファイルに連鎖群と地図上での位置を表したデータが含まれている。 map.csvを読み込んで確認してみる。

map <- read.csv("map.csv", row.names = 1)
head(map)
##         chrom  pos
## Hor5        1  0.0
## MWG938      1  0.7
## MWG835A     1  2.1
## MWG036A     1  6.2
## MWG837      1 11.0
## Hor1        1 13.1

サイズを確認する。

dim(map)
## [1] 495   2

サイズもgenoとして読み込まれたマーカーデータの列数に一致している。 では、自分で分類した結果と、予め分類されていたデータを比較してみる。 ここでも二元分割表を用いる。

table(lg, map$chrom)
##    
## lg   1  2  3  4  5  6  7
##   1 60  0  0  0  0  0  0
##   2  0 78  0  0  0  0  0
##   3  0  0 81  0  0  0  0
##   4  0  0  0 60  0  0  0
##   5  0  0  0  0 93  0  0
##   6  0  0  0  0  0 56  0
##   7  0  0  0  0  0  0 67

完璧に一致している。 では、次に遺伝子座の並び替えを行ってみる。 連鎖群1(lg = 1)について並べ替えを行ってみよう。まずは、地図距離の行列からlgが1のものだけを抜き出す。

selector <- lg == 1
dmat.lg <- dmat[selector, selector]

巡回セールスマン問題(TSP)を解くための関数を用いて解いてみる。 まずは、TSPとして解くために、マーカー間の地図距離の行列を、 TSPを用いるための特殊なデータタイプに変換する。

tsp <- as.TSP(dmat.lg)

巡回セールスマン問題は、環状になっている最短ルートを見つけだす。 今回は、連鎖地図上の位置を求めるので、環状ではなく、線状になっているマーカーの 位置を求めたい。 環状になっているルートを求める方法を用いて、線状のルート(順番)を求めるために、 全てのマーカーから同じ距離0にあるマーカーをダミーで入れる。 何故、全てのマーカーから同じ距離にあるマーカーを挿入すれば、 環状の最短ルートを解く問題が線状のルートを求める問題に変わるのか、考察してほしい。

tsp_dummy <- insert_dummy(tsp)

solve_TSPという関数を用いて、線状の最短ルート(マーカーの並び順)を求める。

tour <- solve_TSP(tsp_dummy, method = "nn")

次に、NN法(最も近いものを繋いでいく)で並び替えをしたものを、 k-Optimal algorithm (k = 2) でさらに並べなおす。1000回繰り返す。

tour <- solve_TSP(tsp_dummy, method = "two_opt", tour = tour, two_opt_repetitions = 1000)
## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

求められたルートの全長と、ルート内でのマーカーの順番を表示する。

tour_length(tour)
## [1] 153.5629
labels(cut_tour(tour, cut = "dummy"))
##  [1] "MWG036A"  "MWG835A"  "MWG938"   "Hor5"     "Hor1"     "MWG837"  
##  [7] "ABA004"   "snp_0030" "DD1.1A"   "BCD098"   "ABG053"   "snp_0760"
## [13] "Ica1"     "snp_0814" "snp_1498" "RZ166"    "ABG500A"  "End1"    
## [19] "ABG720"   "JS074"    "snp_0314" "ABC164"   "BCD351C"  "ABG022B" 
## [25] "snp_0833" "snp_0293" "snp_1248" "snp_0768" "Glb1"     "snp_0567"
## [31] "snp_0516" "snp_0960" "ABC160"   "snp_0006" "snp_0434" "snp_1144"
## [37] "RZ444"    "snp_1189" "ABC307A"  "snp_0865" "cMWG706A" "ABC257"  
## [43] "iPgd2"    "cMWG733A" "snp_0905" "snp_0963" "AtpbA"    "ABG702A" 
## [49] "snp_0911" "snp_0586" "snp_1443" "ABC261"   "MWG635C"  "Cab2"    
## [55] "Aga7"     "CDO400"   "MWG912"   "snp_0746" "ABG387A"  "ABG055"

今一度、同じことを繰り返し、その結果を表示する。

tour <- solve_TSP(tsp_dummy, method = "nn")
tour <- solve_TSP(tsp_dummy, method = "two_opt", tour = tour, two_opt_repetitions = 1000)
## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.
tour_length(tour)
## [1] 254.9837
labels(cut_tour(tour, cut = "dummy"))
##  [1] "snp_0293" "snp_0833" "ABG022B"  "BCD351C"  "ABC164"   "snp_0314"
##  [7] "JS074"    "ABG720"   "End1"     "ABG500A"  "RZ166"    "snp_1498"
## [13] "snp_0760" "snp_0814" "Ica1"     "ABG053"   "BCD098"   "DD1.1A"  
## [19] "snp_0030" "ABA004"   "Hor1"     "MWG837"   "MWG036A"  "MWG835A" 
## [25] "MWG938"   "Hor5"     "snp_1248" "snp_0768" "Glb1"     "snp_0567"
## [31] "snp_0516" "snp_0960" "ABC160"   "snp_0006" "snp_0434" "snp_1144"
## [37] "RZ444"    "snp_1189" "ABC307A"  "snp_0865" "cMWG706A" "ABC257"  
## [43] "iPgd2"    "cMWG733A" "snp_0905" "snp_0963" "AtpbA"    "ABG702A" 
## [49] "snp_0911" "snp_0586" "snp_1443" "ABC261"   "MWG635C"  "Cab2"    
## [55] "Aga7"     "CDO400"   "MWG912"   "snp_0746" "ABG387A"  "ABG055"

ほとんどの場合、答えは一致しない。 何回か繰り返して一番短いルートを求める必要がありそうである。そこで、5000回繰り返して、最も短いルートを採択してみる。

まずは、5000回を繰り返す前に、ある時点での最短距離と、それを実現するルートを 代入しておく入れ物が必要となる。ここでは、min_lengthとbest_tourという名前の入れ物を作っておこう。 また、その入れ物に、上で計算した結果を仮に代入しておこう。

min_length <- tour_length(tour)
best_tour <- labels(cut_tour(tour, cut = "dummy"))

では、5000回繰り返し、ある時点での最短距離よりも短いときに、入れ物の中身を入れ替えるようにしてみよう。

for(i in 1:5000) {
    tour <- solve_TSP(tsp_dummy, method = "nn") # NN法でざっくり並べて
    tour <- solve_TSP(tsp_dummy, method = "two_opt", tour = tour, two_opt_repetitions = 1000) # 2-Optimalアルゴリズムで改良する。
    if(tour_length(tour) < min_length) { # その時点での最短距離よりも短い場合
        min_length <- tour_length(tour) # 入れ物の中身を最新の結果で入れ替える
        best_tour <- labels(cut_tour(tour, cut = "dummy"))
    } 
}
## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

## Warning in tsp_two_opt(x_, control = control): Doing multiple repetitions of
## two-opt given a fixed tour does not make sense. Doing only 1 repetition.

こうして得られた長さと順番を表示してみる。

min_length
## [1] 142.5471
best_tour
##  [1] "Hor5"     "MWG938"   "MWG835A"  "MWG036A"  "MWG837"   "Hor1"    
##  [7] "ABA004"   "snp_0030" "DD1.1A"   "BCD098"   "ABG053"   "snp_0760"
## [13] "Ica1"     "snp_0814" "snp_1498" "RZ166"    "ABG500A"  "End1"    
## [19] "ABG720"   "JS074"    "snp_0314" "ABC164"   "BCD351C"  "ABG022B" 
## [25] "snp_0833" "snp_0293" "snp_1248" "snp_0768" "Glb1"     "snp_0567"
## [31] "snp_0516" "snp_0960" "ABC160"   "snp_0006" "snp_0434" "snp_1144"
## [37] "RZ444"    "snp_1189" "ABC307A"  "snp_0865" "cMWG706A" "ABC257"  
## [43] "iPgd2"    "cMWG733A" "snp_0905" "snp_0963" "AtpbA"    "ABG702A" 
## [49] "snp_0911" "snp_0586" "snp_1443" "ABC261"   "MWG635C"  "Cab2"    
## [55] "Aga7"     "CDO400"   "MWG912"   "snp_0746" "ABG387A"  "ABG055"

マーカー順をordという名前で保存しておく

ord <- best_tour

実際には既に地図上に順番に並んでいるので、地図データから第1染色体のデータを抜き出し、 答え合わせをしてみる。

selector <- map$chrom == 1
rownames(map[selector,])
##  [1] "Hor5"     "MWG938"   "MWG835A"  "MWG036A"  "MWG837"   "Hor1"    
##  [7] "ABA004"   "snp_0030" "DD1.1A"   "BCD098"   "ABG053"   "Ica1"    
## [13] "snp_0814" "snp_0760" "snp_1498" "RZ166"    "ABG500A"  "End1"    
## [19] "ABG720"   "JS074"    "snp_0314" "ABC164"   "BCD351C"  "ABG022B" 
## [25] "snp_0833" "snp_0293" "snp_1248" "snp_0768" "Glb1"     "snp_0567"
## [31] "snp_0516" "snp_0960" "ABC160"   "snp_0006" "snp_0434" "snp_1144"
## [37] "RZ444"    "snp_1189" "ABC307A"  "snp_0865" "cMWG706A" "ABC257"  
## [43] "iPgd2"    "cMWG733A" "snp_0905" "snp_0963" "AtpbA"    "ABG702A" 
## [49] "snp_0911" "snp_0586" "snp_1443" "ABC261"   "MWG635C"  "Cab2"    
## [55] "Aga7"     "CDO400"   "MWG912"   "snp_0746" "ABG387A"  "ABG055"

逆順になる場合もあるが、ほぼ一致する。

次に、 連鎖地図上での位置を計算してみる。まずは、空の入れ物を準備しておき、 そこに隣接したマーカー間の距離を代入していく。 最初の位置は0.0にしておく。

pos <- rep(NA, length(ord))
pos[1] <- 0.0

for文を使って、順次代入していく。i番目と(i+1)番目のマーカー間の距離をi番目の位置に代入する。

for(i in 1:(length(ord) - 1)) {
    mrk.1 <- ord[i]
    mrk.2 <- ord[i + 1]
    pos[i + 1] <- dmat[ord[i], ord[i + 1]]
}
pos
##  [1] 0.0000000 0.7092674 1.3702059 4.1474169 4.8092973 2.0701476 5.8111486
##  [8] 0.8404153 4.7013058 4.6285608 5.1730179 6.4179962 1.4188204 0.7092674
## [15] 4.7763809 0.7874667 1.5878351 1.3796604 0.6803141 2.8602588 0.7194741
## [22] 2.0701476 1.3608802 0.7143343 2.1596154 1.3608802 0.6803141 1.3608802
## [29] 1.3608802 3.4066220 0.6803141 2.0419508 2.0845402 4.1763521 8.2369800
## [36] 2.0419508 0.7407949 4.4562058 2.0419508 1.3608802 8.5325791 5.0167674
## [43] 0.6944891 4.0085663 3.4066220 1.3608802 1.3608802 2.0991345 3.5775211
## [50] 1.3608802 0.6803141 0.6896989 0.8065216 1.9427246 3.4241464 1.4819152
## [57] 1.3516805 0.6896989 0.7937175 1.3336495

posの中身は今のところ隣接距離になってしまっている。累積距離に変換するには、累積和を計算するためのcumsum関数を使う。

cumsum(pos)
##  [1]   0.0000000   0.7092674   2.0794733   6.2268903  11.0361876  13.1063352
##  [7]  18.9174838  19.7578990  24.4592048  29.0877657  34.2607836  40.6787797
## [13]  42.0976001  42.8068676  47.5832485  48.3707152  49.9585503  51.3382107
## [19]  52.0185248  54.8787836  55.5982577  57.6684053  59.0292854  59.7436197
## [25]  61.9032351  63.2641153  63.9444294  65.3053095  66.6661897  70.0728117
## [31]  70.7531258  72.7950765  74.8796168  79.0559689  87.2929489  89.3348997
## [37]  90.0756946  94.5319004  96.5738512  97.9347313 106.4673104 111.4840778
## [43] 112.1785669 116.1871332 119.5937552 120.9546353 122.3155155 124.4146500
## [49] 127.9921711 129.3530513 130.0333653 130.7230643 131.5295858 133.4723104
## [55] 136.8964568 138.3783720 139.7300526 140.4197515 141.2134689 142.5471185

地図上での位置について、答え合わせをしてみる。

plot(map$pos[selector], cumsum(pos))
abline(0, 1, col = "green", lty = 2)

うまく合わない場合は、地図が逆さまを向いている。 逆順に並べてみよう

plot(map$pos[selector], cumsum(pos[length(pos):1]))
abline(0, 1, col = "green", lty = 2)