Follow along with the video below to see how to install our site as a web app on your home screen.
Nota: This feature may not be available in some browsers.
Ciao, grazie per il controllo e la rielaborazione della grafica, veramente bella. Qui si vede chi si destreggia con le funzioni.x Scythe questo e lo script che ho modificato e che non segnalava alcuni numeri
puoi vedere se riesci a inserire nello script che ho allegato la parte che ai
modificato mi sa che ho combinato un po di casini con l'altro script
ho fatto il copia e incolla ma mi da errore nello script
Sub Main()
   Scrivi : ColoreTesto 2 : Scrivi "Estratti verso ruota  by Scythe"
   Scrivi : ColoreTesto 0 : Scrivi
   Dim ruotaa(5),ruote(5),ambata1(2),ambo1(2),posta(1),poste(2)
   Dim n1(5)
   Dim CollAmbiTrovati
Dim sAmbo
Dim qEstrTrovate
Dim clsCoppia
Dim anum1,anum2
Dim p,pp,k,rr,extra
'Dim ruotaa(5)
  ' Dim n1(5)
   Dim A(5)
   Dim B(5)
   Dim C(5)
   Dim D(5)
   Dim E(5)
   posta(1) = 1
   poste(2) = 1
   'im = CInt(InputBox("Inserisci indice mensile ","Indice ?",1))
   extra = InputBox("Quante estrazioni vuoi controllare ?",0)
   'rr = CInt(InputBox("scegli ruota (1 - 10 )","ruota",1))
   rr = ScegliRuota
   ini = EstrazioneFin - extra
   fin = EstrazioneFin
   ruota = rr
   'co = 0
   k = 0
   For es = ini To fin
      Messaggio(es)
      'If IndiceMensile(es) = im Then
         For p = 1 To 5
            n1(p) = Estratto(es,rr,p)
         Next
         'casi = casi + 1
         'Scrivi String(90,"=") & " Caso n° " & casi,1
         'co = co + 1
         'Scrivi es & "    " & "  n° " & Format2(im) & " del " & DataEstrazione(es),True
         'Scrivi String(90,"="),1
    
          ReDim MatriceCaselleDaEvid(5,1)
         ' Primo elemento
         MatriceCaselleDaEvid(1,0) = rr ' ruota di bari
         MatriceCaselleDaEvid(1,1) = 1 ' primo Estratto
         ' secondo elemento
         MatriceCaselleDaEvid(2,0) = rr ' ruota di bari
         MatriceCaselleDaEvid(2,1) = 2 ' secondo Estratto
         ' terzo elemento
         MatriceCaselleDaEvid(3,0) = rr ' ruota di venezia
         MatriceCaselleDaEvid(3,1) = 3 ' terzo Estratto
         ' quarto elemento
         MatriceCaselleDaEvid(4,0) = rr ' ruota di venezia
         MatriceCaselleDaEvid(4,1) = 4 ' quarto Estratto
          ' quarto elemento
         MatriceCaselleDaEvid(5,0) = rr ' ruota di venezia
         MatriceCaselleDaEvid(5,1) = 5 ' quinto Estratto
         Call DisegnaEstrazione(es,MatriceCaselleDaEvid)
      
      
    
      
       Scrivi "Ruota di " & NomeRuota(ruota) & "    " & Format2(n1(1)) & " " & Format2(n1(2)) & " " & Format2(n1(3)) & " " & Format2(n1(4)) & " " & Format2(n1(5)),True
         Scrivi
         '''''''
        
        
        
        
          For x = 1 To 5
            A(x) = FuoriX(n1(x),50) 'numero da contare se n1 > 50
            B(x) =(50 -(rr - 1) * 5)'numero di caselle  a disposizione fino al 5° di venezia
            C(x) =(50 - B(x)) 'numero di caselle a disposizione per la continuazione del conteggio di n1
            D(x) = Abs(A(x) - B(x)) 'numero di caselle da contare restanti
            E(x) = Abs(D(x) - B(x)) 'scarto di caselle oltre la ruota di origine
            
            If(A(x) < B(x) Or A(x) = B(x))And A(x) Mod 5 <> 0 Then
            ruotaa(1) = rr + Int(A(x)/5)
            Else
            If(A(x) < B(x) Or A(x) = B(x))And A(x) Mod 5 = 0 Then
            ruotaa(1) = rr - 1 + Int(A(x)/5)
            Else
            If A(x) > B(x) And A(x) Mod 5 <> 0 Then
            ruotaa(1) = rr + Int(A(x)/5)
            Else
            If A(x) > B(x) And A(x) Mod 5 = 0 Then
            ruotaa(1) = rr - 1 + Int(A(x)/5)
            End If
            End If
            End If
            End If
            If ruotaa(1) > 10 Then
            ruotaa(1) = ruotaa(1) - 10
            End If
        
            sAmbo = sAmbo & Format2(n1(pp)) & "   " & SiglaRuota(ruotaa(1)) & "" & vbCrLf
        
        
            Scrivi Format2(n1(x)) & "       " & "diretto a   " & SiglaRuota(ruotaa(1)) & "                               ",0,0,1,4 'True,,- 1,1
            Scrivi
        
    
        
        
            'ruotaa(2) = RuotaDiametrale(ruotaa(1))
            'ruote(1) = ruotaa(1)
            'ruote(2) = RuotaDiametrale(ruotaa(1))
            ruote(1) = TT_
            ruote(2) = NZ_
          ambata1(1) = n1(pp)
          ambo1(1) = n1(pp)
          ambo1(2) = Diametrale(n1)
      
    
          ImpostaGiocata 1,ambata1,ruotaa,posta,k,0
          Gioca es,1,,1
          Scrivi
          Scrivi
          'ImpostaGiocata 1,ambo1,ruote,poste,k,0
          'Gioca es,1,,1
    
         Next
      'End If
   Next
Scrivi Format2(sAmbo),1,0,0,3,4,8,8
End Sub
	
	Sub Main()
   Scrivi : ColoreTesto 2 : Scrivi "Estratti verso ruota  by Scythe"
   Scrivi : ColoreTesto 0 : Scrivi
   Dim ruotaa(5)
   Dim n1(5)
   Dim A(5)
   Dim B(5)
   Dim C(5)
   Dim D(5)
   Dim E(5)
   im = CInt(InputBox("Inserisci indice mensile ","Indice ?",1))
   stra = InputBox("Quante estrazioni vuoi controllare ?","Estrazioni",100)
   rr = CInt(InputBox("scegli ruota (1 - 10 )","ruota",2))
   ini = EstrazioneFin - Stra
   fin = EstrazioneFin
   ruota = rr
   co = 0
   For es = ini To fin
      Messaggio(es)
      If IndiceMensile(es) = im Then
         For p = 1 To 5
            n1(p) = Estratto(es,rr,p)
         Next
         casi = casi + 1
         Scrivi String(90,"=") & " Caso n° " & casi,1
         co = co + 1
         Scrivi es & "    " & "  n° " & Format2(im) & " del " & DataEstrazione(es),True
         Scrivi String(90,"="),1
         Scrivi
         Scrivi "estratti  " & SiglaRuota(ruota) & "    " & Format2(n1(1)) & " " & Format2(n1(2)) & " " & Format2(n1(3)) & " " & Format2(n1(4)) & " " & Format2(n1(5)),True
         For x = 1 To 5
            A(x) = FuoriX(n1(x),50) 'numero da contare se n1 > 50
            B(x) =(50 -(rr - 1) * 5)'numero di caselle  a disposizione fino al 5° di venezia
            C(x) =(50 - B(x)) 'numero di caselle a disposizione per la continuazione del conteggio di n1
            D(x) = Abs(A(x) - B(x)) 'numero di caselle da contare restanti
            E(x) = Abs(D(x) - B(x)) 'scarto di caselle oltre la ruota di origine
            For t = 1 To 5
               ruotaa(x) = rr
               If(A(x) < B(x) Or A(x) = B(x))And A(x) Mod 5 <> 0 Then
                  ruotaa(1) = rr + Int(A(x)/5)
               Else
                  If(A(x) < B(x) Or A(x) = B(x))And A(x) Mod 5 = 0 And Cadenza(n1(x)) = 0 Then
                     ruotaa(1) =(rr - 1) + Int(A(x)/5)
                  Else
                     If(A(x) < B(x) Or A(x) = B(x))And A(x) Mod 5 = 0 And Cadenza(n1(x)) = 5 Then
                        ruotaa(1) =(rr - 1) + Int(A(x)/5)
                     Else
                        If A(x) > B(x) And Differenza(n1(x),B(x)) > 51 And A(x) Mod 5 <> 0 Then
                           ruotaa(1) =(rr + Int(n1(x)/5))
                        Else
                           If A(x) > B(x) And Differenza(n1(x),B(x)) < 51 And A(x) Mod 5 <> 0 Then
                              ruotaa(1) = rr + Int(n1(x)/5)
                           Else
                              If A(x) > B(x) And A(x) Mod 5 = 0 Then
                                 ruotaa(1) = rr - 1 + Int(A(x)/5)
                              End If
                           End If
                        End If
                     End If
                  End If
               End If
               If ruotaa(1) > 10 Then
                  ruotaa(1) = ruotaa(1) - 10
               End If
               If n1(x) < 6 Then
                  ruotaa(x) = rr
               End If
            Next
            If ruotaa(1) > 10 Then
               ruotaa(1) = ruotaa(1) - 10
            End If
            Scrivi Format2(n1(x)) & "      " & "  verso >>>>>>>>>>>>>> " & SiglaRuota(ruotaa(1)),True,,- 1,1
            'Scrivi Format2(A(x)) & " " & Format2(B(x)) & " " & Format2(C(x)) & " " & Format2(D(x)) & " " & Format2(E(x)) & "  verso >>>>>>>>>>>>>> " & SiglaRuota(ruotaa(1)),True,,- 1,1 Scrivi Format2(A(x)) & " " & Format2(B(x)) & " " & Format2(C(x)) & " " & Format2(D(x)) & " " & Format2(E(x)) & "  verso >>>>>>>>>>>>>> " & SiglaRuota(ruota
         Next
      End If
   Next
End Sub
	

Sub Main()
   Scrivi : ColoreTesto 2 : Scrivi "Estratti verso ruota  by Scythe and Salvo50"
   Scrivi : ColoreTesto 0 : Scrivi
   Dim Es,R1,Im,Stra,Ini,Fin,Co,P,Ruotaa,Casi,X,Y,Z1,Z2,RR
   Dim N1(5)
   Im = CInt(InputBox("Inserisci indice mensile ","Indice ?",1))
   Stra = InputBox("Quante estrazioni vuoi controllare ?","Estrazioni",200)
   RR = CInt(InputBox("scegli ruota (1 - 10 )","ruota",8))
   Ini = EstrazioneFin - Stra
   Fin = EstrazioneFin
   Co = 0
   For Es = Ini To Fin
      Messaggio(Es)
      If IndiceMensile(Es) = Im Then
         For P = 1 To 5
            N1(P) = Estratto(Es,RR,P)
         Next
         Casi = Casi + 1
         Scrivi String(45,"=") & " Caso n° " & Casi,1
         Co = Co + 1
         Scrivi Es & "    " & "  n° " & Format2(Im) & " del " & DataEstrazione(Es),True
         Scrivi String(45,"="),1
         Scrivi
         Scrivi "estratti  " & SiglaRuota(RR) & Space(4) & StringaNumeri(N1," ",True),True
         For X = 1 To 5
            Z1 = 1
            Z2 = 5
            R1 = RR
            For Y = 1 To 18
               If N1(X) >= Z1 And N1(X) <= Z2 Then Ruotaa = R1
               R1 = R1 + 1
               Z1 = Z1 + 5
               Z2 = Z2 + 5
            Next
            If Ruotaa > 10 Then Ruotaa = FuoriX(Ruotaa,10)
            Scrivi Format2(N1(X)) & Space(6) & "  verso >>>>>>>>>>>>>> " & SiglaRuota(Ruotaa),True,,,1
         Next
      End If
   Next
End Sub
	Option Explicit
' controllare che lo script dia risultati esatti, non se ne garantisce il funzionamento
' script richiesto dall utente Paki su lotto ced forum area downLoad
Sub Main
   Dim R
   Dim PosIni
   Dim aR,aP
   Dim IdCol,NewIdCol
   Dim IdEstr,EstrIni,EstrFin
   Dim E,P,nColpi
   nColpi = 9
   R = ScegliRuota
   If R = 0 Or R = 11 Then Exit Sub ' controllo inserimento dati
   PosIni = eval(InputBox(" 1=conta sempre dal 1° estratto" & vbCrLf & " 2=conta dalla posizione di rilevamento","Scegli posizione da cui iniziare a contare",1))
   If Not IsNumeric(PosIni) Or(PosIni < 1 Or PosIni > 2) Then Exit Sub ' controllo inserimento dati
   If Not ScegliRange(EstrIni,EstrFin,EstrazioneFin - 199,EstrazioneFin) Then Scrivi "Ciao":Exit Sub
   Call ResetTimer
   Call GetArrayRuPos(aR,aP) ' carico array ruote e pos in base alla colonna
   If PosIni = 1 Then
      IdCol =(R*5) -(4)
      For IdEstr = EstrIni To EstrFin
         Call GetTitTab(IdEstr,R)
         For P = 1 To 5
            E = Estratto(IdEstr,R,P)
            NewIdCol = FuoriX((IdCol - 1) + E,50)
            Call GetTab(idestr,aR,aP,E,P,NewIdCol,nColpi,PosIni)
         Next ' fine ciclo posizioni
         Scrivi String(52,"-")
         Call AvanzamentoElab(EstrIni,EstrFin,IdEstr)
      Next ' fine ciclo idestr
   ElseIf PosIni=2 Then
      For IdEstr = EstrIni To EstrFin
         Call GetTitTab(IdEstr,R)
         For P = 1 To 5
            IdCol =(R*5) -(5 - P) ' calcolo colonna posizione iniziale
            E = Estratto(IdEstr,R,P)
            NewIdCol = FuoriX((IdCol - 1) + E,50)' calcolo nuova colonna
            Call GetTab(idestr,aR,aP,E,P,NewIdCol,nColpi,P)
         Next ' fine ciclo posizioni
         Scrivi String(52,"-")
         Call AvanzamentoElab(EstrIni,EstrFin,IdEstr)
      Next ' fine ciclo idestr
   End If
   Scrivi "Elaborazione in :" & TempoTrascorso
End Sub
Sub GetArrayRuPos(aR,aP)
   aR = Array(0,1,1,1,1,1,2,2,2,2,2,3,3,3,3,3,4,4,4,4,4,5,5,5,5,5,6,6,6,6,6,7,7,7,7,7,8,8,8,8,8,9,9,9,9,9,10,10,10,10,10)
   aP = Array(0,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5,1,2,3,4,5)
End Sub
Sub GetTitTab(IdEstr,IniRu)
   Scrivi " Conc: " & GetInfoEstrazione(IdEstr) & "| " & SiglaRuota(IniRu) & " " & StringaEstratti(IdEstr,IniRu) & "  ",1,,RGB(47,47,47),RGB(183,238,242)
   Scrivi "|Pin| E | nRu |  Esito  |nColpo|    Estrazione     |",1,,RGB(47,47,47),vbGreen
End Sub
Sub GetTab(idestr,aR,aP,E,P,IdCol,nColpi,PosIni)
   Dim nClp,Esi,Colp,Estrazione
   Dim aN(1):aN(1) = E
   Dim aRuVer(1):aRuVer(1) = aR(IdCol)
   Call VerificaEsitoTurbo(aN,aRuVer,idEstr + 1,1,nColpi,,Esi,Colp,Estrazione)
   If Esi = "" Then Esi = "Negativo"
   Scrivi "  " & PosIni & " |" & FormatSpace(E,2) & "  (" & aP(IdCol) & SiglaRuota(aRuVer(1)) & ") " & FormatSpace(Esi,9) & "   " & FormatSpace(Colp,2) & "  | " & FormatSpace(Estrazione,17) & " | "
End Sub
	Sub Main()
   Scrivi : ColoreTesto 2 : Scrivi "Estratti verso ruota  by Scythe"
   Scrivi : ColoreTesto 0 : Scrivi
   Dim ruotaa(5)
   Dim n1(5)
   Dim pos(5)
   ' Dim S(5)
   Dim ruo(5)
   Dim nwpo(5)
   Dim nsp(5)
   Dim Dnsp(5)
   Dim Iso(5)
   Dim Diso(5)
   Dim Ddiso(5)
   Dim Ddnsp(5)
   Dim Dn1(5)
   Dim Ddn1(5)
  
   Dim Pc1(5)
   Dim pc(5)
   Dim npc(5)
   Dim Ddnpc(5)
   Dim Dnpc(5)
   im = CInt(InputBox("Inserisci indice mensile ","Indice ?",1))
   stra = InputBox("Quante estrazioni vuoi controllare ?","Estrazioni",100)
   rr = CInt(InputBox("scegli ruota (1 - 10 )","ruota",1))
   ini = EstrazioneFin - Stra
   fin = EstrazioneFin
   ruota = rr
   co = 0
   For es = ini To fin
      Messaggio(es)
      If IndiceMensile(es) = im Then
         For p = 1 To 5
            n1(p) = Estratto(es,rr,p)
            pos(p) = Posizione(Es,rr,n1(p))
            q = 6 - pos(p)
            nwpo(p) =(n1(p) - q) Mod 5
            If n1(p) Mod 5 <> 0 Then
               ruotaa(p) = rr + Int((n1(p)/5))
               If pos(p) = 1 And nwpo(p) <> 1 Then
                  nwpo(p) = 1
               End If
               If nwpo(p) = 0 And pos(p) <> 1 Then
                  nwpo(p) = 5
                  ' End If
               End If
            End If
            If ruotaa(p) > 10 Then
               ruotaa(p) = FuoriX(ruotaa(p),10)
            End If
            If n1(p) Mod 5 = 0 Then
               ruotaa(p) =(rr - 1) + Int((n1(p)/5))
               nwpo(p) =(n1(p) - q) Mod 5
               If pos(p) = 1 Then
                  nwpo(p) = 1
               End If
            End If
            If ruotaa(p) > 10 Then
               ruotaa(p) = FuoriX(ruotaa(p),10)
            End If
            ruo(p) = ruotaa(p)
            If nwpo(p) < pos(p) Then
               ruo(p) = ruo(p) + 1
               If Cadenza(n1(p)) = 6 Then
                  ruo(p) = ruotaa(p) + 1
               End If
               If ruo(p) > 10 Then
                  ruo(p) = FuoriX(ruo(p),10)
               End If
               If nwpo(p) < 0 Then
                  If n1(p) = 1 Then
                     nwpo(p) = pos(p)
                     ruo(p) = ruotaa(p)
                  End If
                  If n1(p) = 2 Then
                     nwpo(p) = nwpo(p) + 5
                     ruo(p) = ruotaa(p)
                  End If
                  If n1(p) = 3 Then
                     nwpo(p) = nwpo(p) + 5
                     ruo(p) = ruotaa(p)
                  End If
               End If
            End If
          
            nsp(p) = Estratto(Es,ruo(p),nwpo(p))
            Dnsp(p) = Diametrale(nsp(p))
            Ddnsp(p) = DiametraleD(nsp(p))
            Iso(p) = Estratto(Es,ruotaa(p),pos(p))
            Diso(p) = Diametrale(Iso(p))
            Ddiso(p) = DiametraleD(Iso(p))
            Dn1(p) = Diametrale(n1(p))
            Ddn1(p) = DiametraleD(n1(p))
          
          
            If n1(p) < 5 Then
               Pc1(p) =(n1(p) + 10) Mod 5
               npc(p) = Estratto(Es,ruotaa(p),Pc1(p))
           End If
            Pc1(p) = n1(p) Mod 5
              
            
            If n1(p) Mod 5 = 0 Then
               Pc1(p) = 5
            End If
            npc(p) = Estratto(Es,ruotaa(p),Pc1(p))
        Dnpc(p)=Diametrale(npc(p))
        Ddnpc(p)= DiametraleD(npc(p))
         Next
         casi = casi + 1
         Scrivi String(155,"=") & " Caso n° " & casi,1
         co = co + 1
         Scrivi es & " " & "n° " & Format2(im) & " del " & DataEstrazione(es) & _
          "  " & " da 1^ "&  "suo D"&"  Dd       " & "                                                     D estr  Dd estr  Iso    D    Dd   D nuovo  Dd nuovo ",True
         Scrivi String(155,"="),1
         Scrivi
         Scrivi "estratti " & SiglaRuota(ruota) & " " & Format2(n1(1)) & " " & Format2(n1(2)) & " " & Format2(n1(3)) & " " & Format2(n1(4)) & " " & Format2(n1(5)),True
         For x = 1 To 5
            If ruo(x) = ruotaa(x)Then
               Scrivi Format2(n1(x)) & " " & "      " & ">>>>>    " & _
               SiglaRuota(ruotaa(x)) & " > " & " " & pos(x) & "^" & " trova " & Format2(npc(x)) & "  "&Format2(Dnpc(x))&"  "&Format2(Ddnpc(x))&"       rimane   " & "   a  " & " - " & SiglaRuota(ruo(x)) & " In " & nwpo(x) & "^ " & " trova " & _
               Format2(nsp(x)) & "----" & " altri numeri   " & Format2(Dn1(x)) & "     " & Format2(Ddn1(x)) & "     " & Format2(Iso(x)) & "     " & Format2(Diso(x)) & "     " & Format2(Ddiso(x)) & "     " & Format2(Dnsp(x))_
                  & "     " & Format2(Ddnsp(x)),True,,- 1,1
            End If
            If ruo(x) <> ruotaa(x)Then
               Scrivi Format2(n1(x)) & " " & "      " & ">>>>>    " & _
               SiglaRuota(ruotaa(x)) & " > " & " " & pos(x) & "^" & " trova " & Format2(npc(x)) &"  "& Format2(Dnpc(x))&"  "&Format2(Ddnpc(x))& "   si trasferisce " & " su " & ">  " & SiglaRuota(ruo(x)) & " In " & nwpo(x) & "^ " & " trova " & _
               Format2(nsp(x)) & "----" & " altri numeri   " & Format2(Dn1(x)) & "     " & Format2(Ddn1(x)) & "     " & Format2(Iso(x)) & "     " & Format2(Diso(x)) & "     " & Format2(Ddiso(x)) & "     " & Format2(Dnsp(x))_
                  & "     " & Format2(Ddnsp(x)),True,,- 1,1
            End If
         Next
      End If
   Next
End Sub
	ciao, l'indice può sempre essere tolto. l'indice serve di solito per verificare quale estrazione del mese dà risultati migliori del metodo applicato, o almeno, penso sia così.buon anno
ciao a tutti
provo a vedere lo script di ilegend e dello script di scythe
x scythe non so perche metti l'indice mensile e a cosa serve l'indice mensile
se il calcolo del conteggio si fa sempre ad ogni est ..