Kamis, 29 April 2010

Melakukan setting network shared folder in windows 7

Langkah-langkah untuk melakukan penyettingan:

  1. Buka network and sharing center
  2. Set advanced sharing setting di sebelah kiri atas
  3. Lalu pilih opsi enable network discovery, file sharing, public folder sharing untuk
  4. Lalu tinggal pilih folder mana yang akan dishare melalui windows explorer (klik kanan di folder, pilih sharing, dan aktifkan sharing)
  5. Voila ! Folder itu dan komputer yang dishare akan tampak di bagian network pada windows explorer.

Settingan di atas tampak hanya berhasil apabila pengguna komputer hanya menggunakan komputer tersebut dengan cara ‘biasa’, setinggan koneksi pakai router, tidak pakai firewall tambahan, dll.

Untuk mengkoneksikan komputer dan netbook menggunakan kabel lan cross dengan menggunakan ip statik (ip cuma beda satu digit terakhir, subnet mask sama), kemudian untuk firewall menggunakan windows7firewall control yang benar-benar memberikan pilihan program apa saja yang boleh lewat. Bila di data langkah per langkah inilah permasalahannya :

- Setting ip statik

Langkah pertama, karena langsung pakai kabel lan cross, tanpa router maka settingan ip diset statik. Pastikan settingan ip dan subnet mask benar. (cara paling gampang, set ip : xxx.xxx.xxx.xxy, (hanya berbeda di digit terakhir dan subnet mask 255.255.255.0)

- Coba ping – General Failure Error

Setelah ip diset, cek apakah bisa mengirim data dari komputer ke netbook dengan ping.

Masalah yang muncul pada ping biasanya adalah general failure error. Hal ini terjadi karena sistem tidak bisa mengirimkan paket ping karena diblok. Masalah ini biasa terjadi apabila menggunakan firewall tambahan seperti norton atau windows 7 firewall control. Pastikan program “general process service windows” dalam bentuk file scvhost bisa mengakses lokal.

Masalah lain yang bisa terjadi adalah destination host unreachable, hal ini karena tujuan tidak ditemukan. Masalah ini biasa selesai apabila langkah 4 telah dilakukan.

- Set shared folder

Set folder mana yang bisa dishare, cukup klik kanan di foldernya dengan windows explorer dan pilih share.

- Setting network yang berbeda

ingat change advanced share setting yang ada di bagian kiri atas di network and sharing centre . Di situ perubahan setting dapat dilakukan seperti network discovery, file sharing, dll. Yang penting dilihat di sini adalah windows membagi network dalam tiga jaringan, yaitu public, work, dan home. Kalau misal hanya terkoneksi pada satu komputer saja maka menganggap semua jaringan sebagai public tidak masalah (walau sebenarnya tidak disarankan). Apabila seperti saya, dimana komputer desktop terkoneksi dengan internet, maka sebagai akibatnya desktop saya akan sudah terkoneksi kepada sebuah jaringan public. Apabila saya menset enable file sharing di public, tentu akan menimbulkan potensi bahaya keamanan.

Oleh karena itu, sebaiknya yang dilakukan adalah menset file sharing hanya pada home saja. Akan tetapi, hal ini menimbulkan masalah baru, dimana network baru dengan cable cross yang telah dibuat antara netbook dan dekstop secara otomatis akan diset menjadi public network oleh windows 7 dan tidak ada pilihan bagaimana untuk merubahnya kembali. xD

Setelah berkutat lama, akhirnya ketemu juga cara untuk mengakalinya. Dengan menggunakan komputer yang hanya terkoneksi pada network yang dimaksud saja (dalam hal ini netbook), buka windows eksplorer, lalu pilih network. Akan timbul notifikasi di atas dimana network discovery belum diaktifkan (tentu saja, karena jaringan masih dalam bentuk public). Klik notifikasi itu, dan akan muncul pilihan yaitu no, jangan aktifkan file sharing untuk public, dan yes, aktifkan file sharing untuk publik. Jangan pilih yang kedua, tetapi pilih yang pertama. Entah knapa windows akan mengubah jaringan yang terkoneksi sekarang, yaitu sebelumnya (unidentified network, public), secara otomatis menjadi work. (yang sampai sekarang saya tak tahu kenapa.. xD) Sekarang, mestinya public share pada komputer akan terdeteksi via netbook.

- Masalah pada tiap kali koneksi

Untuk tiap kali koneksi, biasanya akan butuh user dan password. Masukkan sekali saja dan pilih save agar secara otomatis terkoneksi. Sayangnya tiap kali mencopot kabel lan, permasalahan sebelumnya kembali muncul, sehingga setiap kali mencopot dan memasang kabel harus melakukan lagi langkah sebelumnya untuk membuat network yang terdeteksi menjadi public.

- Network shared folder sudah bisa dipakai.

Jumat, 16 April 2010

Album Terbaru My Chemical Romance Lebih Amerika
Indonesiaselebriti.com Jumat, 20 November 2009

Band rock My Chemical Romance (MCR), kini sedang membuat lagu yang berdurasi pendek untuk album terbarunya. Mereka menjelaskan, di album keempat mereka nanti, nuansa MCR akan lebih terdengar layaknya band Amerika.


Ide pembuatan lagu berdurasi singkat tersebut diakui My Chemical Romance terinspirasi oleh sebuah band yang bernama The Stooges.

Band yang hits dengan single ‘Helena’ ini, diketahui sedang masuk studio untuk mengerjakan album terbaru. MCR sedang berusaha untuk mencari cara mengulang kesuksesan album terkahir mereka yaitu 'Black Parade' yang dirilis pada tahun 2006. Mereka menyatakan, album terbaru mereka nanti nuansa musiknya akan jauh berbeda dari sebelumnya.

"Kami ingin memanfaatkan segala sesuatu yang hebat tentang band ini dengan membuat lagu-lagu yang lebih pendek. Pokoknya protopunk deh, seperti band The Stooges atau MC5,” ujar vokalis MCR, Gerard Way yang dikutip dari majalah Rolling Stone.

"Kami ingin menjadi band rock Amerika, bukan sebuah band rock Inggris." Ucapnya.

Salah satu lagu favorit Gerard dalam album terbaru MCR nanti adalah 'Death Before Disco'. Dirinya juga sudah tidak sabar mengetahui reaksi penggemar ketika sudah mendengar lagu tersebut.

"Saya sudah nggak sabar untuk mendengarkan lagu ini ke masyarakat. Bagi saya, lagu ini merupakan karya terhebat yang pernah kami buat. Itu adalah lagu My Chemical Romance favorit saya," tutupnya. ALT/IndonesiaSelebriti.com

Artikel Lain

SOURCE KODE VB

lpa ngopi spa maap aja yg tak kopi

Check For a File

Public Function FileExist(asPath as string) as Boolean
If UCase(Dir(asPath))=Ucase(trimPath(asPath)) then
FileExist=true
Else

FileExist=False
End If
End Function

Public Function TrimPath(ByVal asPath as string) as string

if Len(asPath)=0 then Exit Function
Dim x as integer
Do

x=Instr(asPath,”\”)
if x=0 then Exit Do
asPath=Right(asPath,Len(asPath)-x)
Loop
TrimPath=asPath
End Function

Private sub command1_Click()
if fileExist(Text1.text) then
Label1=”YES”
else
Label1=”NO”
End if
End Sub

Private sub form_Load()
End sub

Low and Upper Case

‘add 2 command buttons and 1 text

Private Sub Command1_Click()
Text1.Text = CapFirst$(Text1.Text)
End Sub

Private Sub Command2_Click()
Text1.Text = LCase$(Text1.Text)
End Sub

‘add 1 module
Declare Function CapFirst$ Lib “CAPFIRST.DLL” Alias “CAPFIRST” (ByVal St$)

Show Your IP Address

Add Microsoft Winsock Control 6.0 component
Insert 1 Textbox
Insert 2 Command Buttons Rename Caption as Display and Clear

Private Sub Command1_Click()
If Text1.Text = “” Then
Command1.Enabled = False
Text1.Text = Winsock1.LocalIP
Else
Command1.Enabled = True
End If
End Sub

Private Sub Command2_Click()
Text1.Text = “”
If Text1.Text = “” Then
Command1.Enabled = True
Else
Command1.Enabled = False
End If
End Sub

Private Sub Form_Load()
Text1.Text = “”
If Text1.Text = “” Then
Command1.Enabled = False
Else
Command1.Enabled = True
End If
Text1.Text = Winsock1.LocalIP
End Sub

Permutasi

Option Explicit

Dim id As Integer
Dim N As Integer
Dim perm() As Integer

Function Engine(i As Integer)
Dim t As Integer
Dim j As Integer

id = id + 1
perm(i) = id
If (id = N) Then stampaj
For j = 1 To N
If (perm(j) = 0) Then
Engine (j)
End If
DoEvents
Next j
id = id - 1
perm(i) = 0
End Function

Private Sub cmdClear_Click()
List1.Clear
End Sub

Private Sub cmdGen_Click()
If Val(txtLength.Text) > Len(txtChar.Text) Then
MsgBox “Jumlah Permutasi Salah”
Exit Sub
End If

If Len(txtChar.Text) = 0 Or (Val(txtLength.Text) = 0) Then Exit Sub

Dim i As Integer
N = Val(txtLength.Text)
ReDim perm(N)
For i = 1 To N
perm(i) = 0
Next i
If ChSave.Value = 1 Then
MsgBox “Disimpan pada hasil.txt”
Open App.Path + “\hasil.txt” For Output As #1
End If
Engine 0
If ChSave.Value = 1 Then Close #1

End Sub

Sub Form_Load()
On Error Resume Next
id = -1

End Sub

Sub stampaj()
Dim i As Integer
Dim result As String
result = “”
For i = 1 To N
result = result & CStr(Mid$(txtChar.Text, perm(i), 1))
Next i
List1.AddItem result
If ChSave.Value = 1 Then Print #1, result
End Sub

Enkripsi Searah

Public Function Hash(ByVal text As String) As String
a = 1
For i = 1 To Len(text)
a = Sqr(a * i * Asc(Mid(text, i, 1))) ‘Numeric Hash
Next i
Rnd (-1)
Randomize a ’seed PRNG

For i = 1 To 16
Hash = Hash & Chr(Int(Rnd * 256))
Next i
End Function

Private Sub Form_Load()
MsgBox Hash(“EmZ-2509″) ‘Yang dihasilkan: ‰°’r¿¾ ©Ì¿ÂX*¤W
End
End Sub

Enkripsi

Function EncDec(inData As Variant, Optional inPW As Variant = “”) As Variant
On Error Resume Next
Dim arrSBox(0 To 255) As Integer
Dim arrPW(0 To 255) As Integer
Dim Bi As Integer, Bj As Integer
Dim mKey As Integer
Dim i As Integer, j As Integer
Dim x As Integer, y As Integer
Dim mCode As Byte, mCodeSeries As Variant

EncDec = “”
If Trim(inData) = “” Then
Exit Function
End If

If inPW <> “” Then
j = 1
For i = 0 To 255
arrPW(i) = Asc(Mid$(inPW, j, 1))
j = j + 1
If j > Len(inPW) Then
j = 1
End If
Next i
Else
For i = 0 To 255
arrPW(i) = 0
Next i
End If

For i = 0 To 255
arrSBox(i) = i
Next i

j = 0
For i = 0 To 255
j = (arrSBox(i) + arrPW(i)) Mod 256
x = arrSBox(i)
arrSBox(i) = arrSBox(j)
arrSBox(j) = x
Next i

mCodeSeries = “”
Bi = 0: Bj = 0
For i = 1 To Len(inData)
Bi = (Bi + 1) Mod 256
Bj = (Bj + arrSBox(Bi)) Mod 256
‘ Tukar
x = arrSBox(Bi)
arrSBox(Bi) = arrSBox(Bj)
arrSBox(Bj) = x

’siapkan kunci untuk XOR
mKey = arrSBox((arrSBox(Bi) + arrSBox(Bj)) Mod 256)

‘gunakan operasi XOR
mCode = Asc(Mid$(inData, i, 1)) Xor mKey
mCodeSeries = mCodeSeries & Chr(mCode)
Next i
EncDec = mCodeSeries
End Function

Private Sub Form_Load()
Dim Encrypt As String, Decrypt As String

Encrypt = EncDec(“admin”, “win”)
Decrypt = EncDec(“™D`­>”, “win”)
MsgBox “Hasil enkripsi : ” & Encrypt & _
vbCrLf & “Hasil dekripsi : ” & Decrypt
End
End Sub

Menu Pop Up

Option Explicit

Private Declare Function SendMessage Lib “user32″ Alias _
“SendMessageA” (ByVal hwnd As Long, ByVal wMsg As Long, _
ByVal wParam As Long, lParam As Any) As Long

Private Const LB_GETITEMRECT = &H198
Private Const LB_ERR = (-1)

Private Type RECT
Left As Long
Top As Long
Right As Long
Bottom As Long
End Type

Public Function GetRClickedItem(MyList As Control, _
X As Single, Y As Single) As Long

‘PURPOSE: Determine which item was right clicked in a list
‘box, from the list_box’s mouse down event. YOU MUST CALL THIS
‘FROM THE MOUSEDOWN EVENT, PASSING THE X AND Y VALUES FROM THAT
‘EVENT TO THIS FUNCTION

‘MYLIST: ListBox Control
‘X, Y: X and Y position from MyList_MouseDown

‘RETURNS: ListIndex of selected item, or -1 if
‘a) There is no selected item, or b) an error occurs.

Dim clickX As Long, clickY As Long
Dim lRet As Long
Dim CurRect As RECT
Dim l As Long

‘Control must be a listbox
If Not TypeOf MyList Is ListBox Then
GetRClickedItem = LB_ERR
Exit Function
End If

‘get x and y in pixels
clickX = X Screen.TwipsPerPixelX
clickY = Y Screen.TwipsPerPixelY

‘Check all items in the list to see if it was clicked on
For l = 0 To MyList.ListCount - 1

‘get current selection as rectangle
lRet = SendMessage(MyList.hwnd, LB_GETITEMRECT, l, CurRect)

‘If the position of the click is in the this list item
‘then that’s our Item

If (clickX >= CurRect.Left) And (clickX <= CurRect.Right) _ And (clickY >= CurRect.Top) And _
(clickY <= CurRect.Bottom) Then

GetRClickedItem = l
Exit Function
End If
Next l
End Function

Private Sub Form_Load()
List1.AddItem “Merah”
List1.AddItem “Kuning”
List1.AddItem “Hijau”
mnuPopUp.Visible = False
End Sub

Private Sub List1_MouseDown(Button As Integer, Shift As Integer, X As Single, Y As Single)
Dim lItem As Long

If Button = vbRightButton Then
lItem = GetRClickedItem(List1, X, Y)

If lItem <> -1 Then
List1.ListIndex = lItem
PopupMenu mnuPopUp
End If
End If

End Sub

Load Picture

Private Sub Command1_Click()
With Me.CommonDialog1
.DialogTitle = “Ambil Gambar”
.Filter = “JPEG|*.jpg”
.ShowOpen

If .FileName <> “” Then
Set Me.Picture1.Picture = Nothing
Me.Picture1.Picture = LoadPicture(.FileName)
End If
End With
End Sub

‘Private Sub Form_Load()
‘Me.Picture1.Picture = LoadPicture(“D:\gbr_motor\bikes_honda_01.jpg”)
‘End Sub

Sleep With Visual Basic

Option Explicit

Private Declare Sub Sleep Lib “kernel32″ (ByVal dwMilliseconds As Long)

Private Sub Form_Click()
Me.Caption = “Sleeping”
Call Sleep(20000)
Me.Caption = “Awake”
End Sub

Private Sub Label1_Click()
Me.Caption = “Sleeping”
Call Sleep(20000)
Me.Caption = “Awake”
End Sub

Posted by Administrator in 08:18:13 | Permalink | No Comments »

Find Something

Form

Option Explicit

Private Declare Function GetWindowText Lib “user32″ Alias “GetWindowTextA” (ByVal hWnd As Long, ByVal lpString As String, ByVal cch As Long) As Long

Private Sub cmdActivate_Click()
Dim nRet As Long
Dim Title As String

nRet = AppActivatePartial(Trim(txtTitle.Text), _
Val(frmMethod.Tag), CBool(chkCase.Value))
If nRet Then
lblResults.Caption = “Found: &&H” & Hex$(nRet)
Title = Space$(256)
nRet = GetWindowText(nRet, Title, Len(Title))
If nRet Then
lblResults.Caption = lblResults.Caption & _
“, “”" & Left$(Title, nRet) & “”"”
End If
Else
lblResults.Caption = “Search Failed”
End If
End Sub

Private Sub Form_Load()

txtTitle.Text = “”
lblResults.Caption = “”
optMethod(0).Value = True
End Sub

Private Sub optMethod_Click(Index As Integer)

frmMethod.Tag = Index
End Sub

Module

Option Explicit

Private Declare Function EnumWindows Lib “user32″ (ByVal lpEnumFunc As Long, ByVal lParam As Long) As Long
Private Declare Function GetClassName Lib “user32″ Alias “GetClassNameA” (ByVal hWnd As Long, ByVal lpClassName As String, ByVal nMaxCount As Long) As Long
Private Declare Function GetWindowText Lib “user32″ Alias “GetWindowTextA” (ByVal hWnd As Long, ByVal lpString As String, ByVal cch As Long) As Long
Private Declare Function IsIconic Lib “user32″ (ByVal hWnd As Long) As Long
Private Declare Function IsWindowVisible Lib “user32″ (ByVal hWnd As Long) As Long
Private Declare Function ShowWindow Lib “user32″ (ByVal hWnd As Long, ByVal nCmdShow As Long) As Long
Private Declare Function SetForegroundWindow Lib “user32″ (ByVal hWnd As Long) As Long

Private Const SW_RESTORE = 9

Private m_hWnd As Long
Private m_Method As FindWindowPartialTypes
Private m_CaseSens As Boolean
Private m_Visible As Boolean
Private m_AppTitle As String

Public Enum FindWindowPartialTypes
FwpStartsWith = 0
FwpContains = 1
FwpMatches = 2
End Enum

Public Function AppActivatePartial(AppTitle As String, Optional Method As FindWindowPartialTypes = FwpStartsWith, Optional CaseSensitive As Boolean = False) As Long
Dim hWndApp As Long

hWndApp = FindWindowPartial(AppTitle, Method, CaseSensitive, True)
If hWndApp Then

If IsIconic(hWndApp) Then
Call ShowWindow(hWndApp, SW_RESTORE)
End If
Call SetForegroundWindow(hWndApp)
AppActivatePartial = hWndApp
End If
End Function

Public Function FindWindowPartial(AppTitle As String, _
Optional Method As FindWindowPartialTypes = FwpStartsWith, _
Optional CaseSensitive As Boolean = False, _
Optional MustBeVisible As Boolean = False) As Long

m_hWnd = 0
m_Method = Method
m_CaseSens = CaseSensitive
m_AppTitle = AppTitle

If m_CaseSens = False Then
m_AppTitle = UCase$(m_AppTitle)
End If

Call EnumWindows(AddressOf EnumWindowsProc, MustBeVisible)
FindWindowPartial = m_hWnd
End Function

Private Function EnumWindowsProc(ByVal hWnd As Long, ByVal lParam As Long) As Long
Static WindowText As String
Static nRet As Long

If lParam Then
If IsWindowVisible(hWnd) = False Then
EnumWindowsProc = True
Exit Function
End If
End If

WindowText = Space$(256)
nRet = GetWindowText(hWnd, WindowText, Len(WindowText))
If nRet Then

WindowText = Left$(WindowText, nRet)
If m_CaseSens = False Then
WindowText = UCase$(WindowText)
End If

Select Case m_Method
Case FwpStartsWith
If InStr(WindowText, m_AppTitle) = 1 Then
m_hWnd = hWnd
End If
Case FwpContains
If InStr(WindowText, m_AppTitle) <> 0 Then
m_hWnd = hWnd
End If
Case FwpMatches
If WindowText = m_AppTitle Then
m_hWnd = hWnd
End If
End Select
End If

EnumWindowsProc = (m_hWnd = 0)
End Function

Sabtu, 03 April 2010

Topologi Local Area Network

Topologi Local Area Network

Jika kita bicara masalah Local Area Network (LAN), maka seharusnya kita juga harus memahami Topology jarinan LAN yang kita gunakan. Ada banyak jenis topologi LAN untuk berbagai macam jenis jaringan. Kita juga perlu memahami topologi fisik dan topologi logical. Topologi fisik menjelaskan layout dari suatu media jaringan seperti kabel tembaga, kabel fiber optic, dan yang lagi ngetrend sekarang ini adalah wireless. Sementara topologi logical konsen masalah jalur logical jaringan dimana data bisa melewatinya dari satu tempat (komputer) ke komputer lainnya.

Lihat juga topologi jaringan LAN dalam real industry serta infrastructure jaringan.

Berikut ini adalah jenis topologi LAN dasar:

  • Bus
  • Star
  • Ring
  • Mesh
  • Hybrids

Bus Topology

Jenis pertama dalam topologi LAN adalah topologi Bus yang merupakan jenis pertama dalam teknologi jaringan Ethernet dan terdiri dari cable coaxial yang terhubung ke semua komputer yang ada dalam jaringan dimana tiap komputer terhubung dengan sambungan konektor BNC jenis T. Gambar berikut menunjukkan jenis topologi Bus.

Topologi Bus

Semua komputer berkomunikasi melalui Bus yang sama – makanya Bus juga merupakan topologi logical juga. Umumnya dalam topologi Bus ini memerlukan adanya algoritma pendeteksi collision (CD – collision detection) atau penghindar collision (CA – collision avoidance) karena sifat dari Bus ini adalah broadcast ke semua komputer sehingga rentan terjadinya tabrakan packet.

Pro:

  • Topologi Bus ini sangat sederhana dan gampang di implementasikan dengan jalan menyambung ke semua computer dengan hanya satu backbone kabel BNC.

Cons:

  • Topologi Bus ini memerlukan terminator yang bagus dan sempurna pada kedua ujung kabel Bus. Yang paling sering terjadi adalah short circuit antara data dan ground jika sambungan terminator tidak bagus. Terminator yang tidak bagus bahkan bisa menyebabkan jaringan tidak berfungsi.
  • Dengan satu kabel trunk tunggal menjadi satu titik tunggal kegagalan, satu titik bermasalah maka akan menyebabkan kegagalan total semua jaringan.
  • Susah dalam troubleshooting masalah jika terjadi kegagalan fungsi kabel. Anda harus memeriksa segmen per segmen untuk mengidentifikasikan titik kesalahan.

Jenis topologi Bus ini sudah tidak popular lagi sekarang ini bahkan sudah susah untuk mencari Ethernet jenis BNC.

LAN Star Topology

Topologi LAN kedua adalah topologi Star. Star seperti halnya anda menarik satu kabel jaringan setiap komputer menuju ke pusat kosentrasi seperti Switch, itulah konsep dasar topologi Star. Switch menangani Switching traffic keluar ke node lainnya dalam jaringan. Gambar diagram berikut ini menunjukkan gambaran topologi Star.

Pro:

  • Manajemen jaringan mudah melalui per port Switch. Manajemen dan administrasi bisa dilakukan secara remote oleh administrator yang authorized.
  • Setiap kegagalan di salah satu port tidak akan menyebabkan kegagalan total jaringan.
  • Instalasi kabel jaringan ke setiap port tidak akan mengganggu layanan jaringan seperti halnya pada topologi Bus.
  • Tidak diperlukan terminator.

Anda bisa perhatikan sekarang ini bahwa hampir semua implementasi jaringan menggunakan topologi Star dalam implementasi fisiknya.

Ring Topology

Topologi LAN ketiga adalah topologi Ring. Dibanding topologi Bus dan Star, topologi Ring ini lebih complex akan tetapi menawarkan feature yang menarik. Node berkomunikasi dengan formasi Ring, dengan setiap node berkomunikasi langsung hanya dengan upstream dan downstream tetangganya saja.

Gambar berikut menunjukkan topologi Ring. Sebenarnya topologi Ring ini di implementasikan secara fisik seperti topologi Star.

Pada topologi Ring, akses kepada jaringan dikendalikan melalui sebuah Token yang melewati dari node ke node dengan mekanisme arbitrasi (juri). Setiap node mengambil gilirannya dengan mengklaim Token saat Token melewati dari tetangga ke tetangganya, dan saat node mengambil Token, mengambil gilirannya dan mengirim Token kedalam ring. Sebuah data packet di kirim dari node ke node berikutnya sampai ke node tujuan. Setelah node tujuan menerima packet, ia memodifikasi paket untuk menstempel bahwa paket diterima dan dikirim kembali ke dalam ring. Akhirnya paket menyelesaikan berkeliling kedalam ring dan node yang mengirim menerima kembali Token tersebut dan memberikan catatan kalau paket sudah terkirim sempurna. Jika node pengirim sudah selesai, kemudian ia akan melepas Token ke tetangganya dan proses berulang lagi.

Topologi Ring ini khususnya dipakai pada jaringan Token-ring

Pro:

  • Tidak diperlukan mekanisme collision detection, sehingga Topologi ring memberikan bandwidth maksimal.
  • Troubleshooting lebih mudah karena setia node hanya mengetahui dan berinteraksi dari kedua sisi tetangganya saja.

Cons:

  • Firmware untuk memelihara Ring adalah sangat complex dan harus ada pada setiap Card jaringan yang ikut berpartisipasi dalam jaringan
  • Implementasi Ring adalah sangat mahal dan hampir semua jaringan LAN sekarang ini hampir semuanya memakai jaringan Ethernet karena lebih murah dan gampang didapat dipasaran.

Mesh Topology

Topologi LAN lainnya adalah topologi Mesh yang merupakan suatu hubungan satu sama lain diantara beberapa node. Umumnya, suatu topologi mesh dimaksudkan untuk keperluan redundancy. Setiap jaringan kampus harus menerapkan suatu topologi mesh untuk mencapai tingkat redundancy dan fault tolerance yang merupakan tuntutan bisnis dari jaringan data mereka.Ada dua jenis mesh yaitu full mesh dan partial mesh topologi. Full mesh – setiap node saling berhubungan satu sama lain dengan dedikasi line tersendiri sementara partial seperti namanya hanya sebagian saja mempunyai jalur menurut kebutuhan.

Gambar berikut menunjukkan topologi Mesh secara umum, setiap piranti / node mempunyai koneksi ke setiap piranti lainnya pada jaringan.

Pros:

  • Partial mesh dirancang untuk memberikan redundancy dimana memang diperlukan saja.

Cons:

  • Full mesh adalah sangat tidak praktis terkecuali untuk jaringan yang skalanya kecil saja.
  • Biaya implementasi full mesh adalah sangat mahal sekali karena bersifat redundancy untuk keperluan fault tolerance.

Hybrid Topologies

Pada environment yang besar, anda bisa mengimplementasikan banyak switches satu sama lain untuk membuat jaringan LAN yang besar agar bisa mendukung banyak node. Topologi hybrid ini menggabungkan topologi-topologi diatas bersama untuk membentuk tiga topologi hybrid yang popular: Tree, Hyrarchical star, dan star wireless.

Tree Hybrid Topology

Gambar dibawah menunjukkan kombinasi topologi: Star topologi dikombinasikan dengan topologi bus.

Pro:

  • Suatu komputer yang gagal tidak akan menyebabkan kegagalan semua system jaringan.
  • Jika satu switch tidak berfungsi, ia akan hanya tidak berfungsi pada jaringan pada switch itu saja, sementara komputer lainnya pada switch yang lain masih bisa berkomunikasi secara normal.

Cons:

  • Jika ada masalah pada backbone, maka setiap group switch hanya bisa berkomunikasi pada segmen-segmen switch saja.

Hierarchical Star Topology

Untuk jaringan yang besar anda bisa melakukan konfigurasi dalam topologi hierarchical star seperti tampak dari gambar berikut ini.

Pros:

  • Bisa diimplementasikan pada jaringan yang luas.
  • Switches bisa dikonfigurasikan secara redundancy untuk menghindari satu kegagalan tunggal uplink.

Cons:

  • Ada batasan ukuran besarnya jaringan seperti design IP address dan juga issue masalah timing jika tanpa memperkenalkan technologi routing.

Star Wireless

Teknologi wireless telah banyak menjelma kesemua jaringan sekarang ini dan memakai topologi hybrid. User perlu berada dalam jangkauan wireless roaming untuk bisa berpartisipasi dalam jaringan wireless. Lihat juga jaringan wireless.

Topologi star perlu dibangun untuk menggabungkan banyak access point tersebar seantero bangunan untuk menjamin cakupan wireless kesemua node yang berpartisipasi dalam jaringan. Mengingat jaringan wireless terus berevolusi, begitu juga topologi yang mendukungnya terus berkembang seiring dengan temuan-temuan teknologi baru.

pengenalan jaringan LAN

  Pengertian dan Prinsip Kerja LAN

================================

LAN dapat definisikan sebagai network atau jaringan sejumlah sistem
komputer yang lokasinya terbatas didalam satu gedung, satu kompleksgedung
atau suatu kampus dan tidak menggunakan media fasilitas komunikasi umum
seperti telepon, melainkan pemilik dan pengelola media komunikasinya
adalah pemilik LAN itu sendiri.
Dari definisi diatas dapat kita ketahui bahwa sebuah LAN dibatasi oleh
lokasi secara fisik. Adapun penggunaan LAN itu sendiri mengakibatkansemua
komputer yang terhubung dalam jaringan dapat bertukar data atau dengan
kata lain berhubungan. Kerjasama ini semakin berkembang dari hanya
pertukaran data hingga penggunaan peralatan secara bersama.
LAN yang umumnya menggunakan hub, akan mengikuti prinsip kerja hub itu
sendiri. Dalam hal ini adalah bahwa hub tidak memiliki pengetahuantentang
alamat tujuan sehingga penyampaian data secara broadcast, dan juga karena
hub hanya memiliki satu domain collision sehingga bila salah satu port
sibuk maka port-port yang lain harus menunggu.



Komponen-komponen Dasar LAN
===========================

Beberapa komponen dasar yang biasanya membentuk suatu LAN adalah sebagai
berikut:

•Workstation
------------
Workstation merupakan node atau host yang berupa suatu sistem komputer.
Sistem komputer ini dapat berupa PC atau dapat pula berupa suatu komputer
yang besar seperti sistem minicomputer, bahkan suatu mainframe.
Workstation dapat bekerja sendiri (stand-alone) dapat pula menggunakan
jaringan untuk bertukar data dengan workstation atau user yang lain.

•Server
-------
Perangkat keras (hardware) yang berfungsi untuk melayani jaringan dan
workstation yang terhubung pada jaringan tersebut.pada umumnya sumber
daya (resources) seperti printer, disk, dan sebagainya yang hendak
digunakan secara bersama oleh para pemakai di workstation berada dan
bekerja pada server. Berdasarkan jenis pelayanannya dikenal disk server,
file server, print server, dan suatu server juga dapat mempunyai beberapa
fungsi pelayanan sekaligus.

•Link (hubungan)
----------------
Workstation dan server tidak dapat berfungsi apabila peralatan tersebut
secara fisik tidak terhubung. Hubungan tersebut dalam LAN dikenal sebagai
media transmisi yang umumnya berupa kabel. Adapun beberapa contoh dari
link adalah:
1.Kabel Twisted Pair
•Kabel ini terbagi dua, yaitu Shielded Twisted Pair dan Unshielded Twisted
Pair(UTP)
•Lebih banyak dikenal karena merupakan kabel telpon
•Relatif murah
•Jarak yang pendek
•Mudah terpengaruh oleh gangguan
•Kecepatan data yang dapat didukung terbatas, 10-16 Mbps

2.Kabel Coaxial
•Umumnya digunakan pada televisi
•Jarak yang relatif lebih jauh
•Kecepatan pengiriman data lebih tinggi di banding Twisted Pair, 30 Mbps
•Harga yang relatif tidak mahal
•Ukurannya lebih besar dari Twisted Pair

3.Kabel Fiber Optic
•Jarak yang jauh
•Kecepatan data yang tinggi, 100 Mbps
•Ukuran yang relatif kecil
•Sulit dipengaruhi gangguan
•Harga yang relatif masih mahal
•Instalasi yang relatif sulit


•Network Interface Card (NIC)
-----------------------------
Suatu workstation tidak dihubungkan secara langsung dengan kabel jaringan
ataupun tranceiver cable, tetapi melalui suatu rangkaian elektronika yang
dirancang khusus untuk menangani network protocol yang dikenal dengan
Network Interface Card (NIC).

•Network Software
-----------------
Tanpa adanya software jaringan maka jaringan tersebut tidak akan bekerja
sebagaimana yang dikehendaki. Software ini juga yang memungkinkan sistem
komputer yang satu berkomunikasi dengan sistem komputer yang lain.

Peralatan Pendukung LAN
=======================

a.Repeater
------------
•Pada OSI, bekerja pada lapisan Physical
•Meneruskan dan memperkuat sinyal
•Banyak digunakan pada topologi Bus
•Penggunaannya mudah dan Harga yang relatif murah
•Tidak memiliki pengetahuan tentang alamat tujuan sehingga penyampaian
data secara broadcast
•Hanya memiliki satu domain collision sehingga bila salah satu port sibuk
maka port-port yang lain harus menunggu.

b.Hub
-----
•Bekerja pada lapisan Physical
•Meneruskan sinyal
•Tidak memiliki pengetahuan tentang alamat tujuan
•Penggunaannya relatif mudah dan harga yang terjangkau
•Hanya memiliki satu buah domain collision

c.Bridge
--------
•Bekerja di lapisan Data Link
•Telah menggunakan alamat-alamat untuk meneruskan data ke tujuannya
•Secara otomatis membuat tabel penterjemah untuk diterima masing2 port

d.Switch
--------
•Bekerja di lapisan Data Link
•Setiap port didalam swith memiliki domain collision sendiri-sendiri
•Memiliki tabel penterjemah pusat yang memiliki daftar penterjemah untuk
semua port
•Memungkinkan transmisi secara full duflex (dua arah)

e.Router
--------
•Router berfungsi menyaring atau memfilter lalu lintas data
•Menentukan dan memilih jalur alternatif yang akan dilalui oleh data
•Menghubungkan antar jaringan LAN, bahkan dengan WAN

Topologi LAN
=============

Pengertian topologi Jaringan adalah susunan lintasan aliran data didalam
jaringan yang secara fisik menghubungkan simpul yang satu dengan simpul
lainnya. Berikut ini adalah beberapa topologi jaringan yang ada dan
dipakai hingga saat ini, yaitu:
•Topologi Star
Beberapa simpul/node dihubungkan dengan simpul pusat/host, yang membentuk
jaringan fisik seperti bintang, semua komunikasi ditangani langsung dan
dikelola oleh host yang berupa mainframe komputer.


[PC1]
|
[PC2]-------[Server]---------[PC3]
/ \
/ \
[PC4] [PC5]




•Topologi Hierarkis
Berbentuk seperti pohon bercabang yang terdiri dari komputer induk(host)
dihubungkan dengan simpul/node lain secara berjenjang. Jenjang yang lebih
tinggi berfungsi sebagai pengatur kerja jenjang dibawahnya.

[Server]
/ \
[server/PC] [server/PC]
/ \ / \
/ \ / \
[PC1] [PC2] [PC3] [PC4]



•Topologi Bus
Beberapa simpul/node dihubungkan dengan jalur data (bus). Masing2 node
dapat melakukan tugas-tugas dan operasi yangberbeda namun semua mempunyai
hierarki yang sama.



[PC1] [PC2] [PC3] [PC4]
| | | |
=backbone================================
| | | |
[PC1] [PC2] [PC3] [PC4]


•Topologi Loop
Merupakan hubungan antar simpul/node secara serial dalam bentuk suatu
lingkaran tertutup. Dalam bentuk ini tak ada central node/host, semua
mempunyai hierarki yang sama.


[PC1]
[PC2] | [PC3]
\|/
(_) <== lingkaran / \ [PC4][PC5] •Topologi Ring Bentuk ini merupakan gabungan bentuk topologi loop dan bus, jika salah satu simpul/node rusak, maka tidak akan mempengaruhi komunikasi node yang lain karena terpisah dari jalur data. [PC1a] [PC1b]__|__[PC1c] <<><== lingkaran / \ [PC4][PC5] •Topologi Web Merupakan bentuk topologi yang masing-masing simpul/node dalam jaringan dapat saling berhubungan dengan node lainnya melalui beberapa link. Suatu bentuk web network dengan n node, akan menggunakan link sebanyak n(n-1)/2. [PC1] / / \ \ [PC2]=-+---+=[PC3] | / \ | [PC4]=-------=[PC5] Dengan menggunakan segala kelebihan dan kekurangan masing2 konfigurasi, memungkinkan dikembangkannya suatu konfigurasi baru yang menggabungkan beberapa topologi disertai teknologi baru agar kondisi ideal suatu sistem jaringan dapat terpenuhi.

all about MCR

Jeff's picture

MTV Musical March Madness – MCR vs. MUSE

MCR is on to the next round in MTV’s Musical March Madness against MUSE. Voting is open until Sunday, April 4th at 10 p.m., and in this round you won’t be able to see the percentages until the voting is over. Get your vote on now – CLICK HERE.

Jeff's picture

MCR Easter Egg Hunt

Easter is right around the corner, and let's face it, everyone likes the thrill of the hunt. With that in mind we present the 2010 MCR Easter Egg hunt. Dig around the site looking for the four MCR easter eggs (1 red, 1 blue, 1 yellow, 1 green). Once you find an egg, click on it and you'll be able to enter your name and email address. The person who finds all 4 of the eggs first will win signed a pack of signed MCR posters. You must be registered and logged in to the site, or you won't be able to see the eggs.

We'll announce the winner as soon as all of the eggs are found. Happy hunting!

Ray's picture

Hello Earth People!

Hey everybody, long time no post! Hope you guys are doing well. Been crazy busy in the studio the past month, working long hours and writing great music. Taking a few days off this holiday weekend, so thought I'd take the chance to give a quick update on some happenings in MCR world. First, a heartfelt thanks for voting for us in the MTV March Madness thing they have going on. Even after being away for a bit, it feels really good to know you are all still with us, ready to strike when called to arms! I'm not sure what it all means, but its always fun to win stuff, so keep voting! I once won $25 on a scratch off lotto ticket, and I can guarantee winning the MTV thing will feel at least 3 times as good as that... Got a new shot of Frank's up as well. Somehow, while shredding the guitar, tending to his family in Jersey, and looking dashing, Frank finds time to take great photos of us while we're tracking. This shot features Doug, our engineer extraordinaire. I would say he's a great dude, but he's been shredding me in Words With Friends! So while he may be good as his job, he is an utter bastard... Speaking of Frank's photos, the first 2 lithos in what will hopefully be an ongoing series go up for sale next week. Be ready and waiting to click the link as soon as its put up, I have a feeling they're going to sell out quick... Tomorrow, we're going to start a run of contests here. It begins with the first annual MCR Easter Egg Hunt. One of my favorite things to do each year is to paint eggs with my wife. Last year we painted up some Transformer themed eggs, so I'll be sure to put up a pic of what we do. So in that spirit, there will be four eggs hidden throughout the site. Find them, click them, enter your username and you'll get the credit and I think win a poster. Watson will have more detailed instructions up soon... Lastly, I will take a quick second to announce my unending obsession with the upcoming iPad. We all know I love gadgets. I probably love gadgets more than air. It will be awaiting on my doorstep Saturday, so after I put it through its paces, I'll put up my thoughts. Thanks for the time, talk to you all soon! Ray

Mikey's picture

Update from Mikey

Greetings Friends!

It's been an awfully long time since last we spoke, and I apologize. To make it up to you, I have many exciting things to share. You have all been so patient, and for that we are eternally grateful.

First things first, here are some new studio shots from our own ace photographer (and soon to be dad!), Frank Iero. We have reached a very exciting final phase of recording and are counting down the seconds to when we can finally share it with you. The album has a name and a voice, although I can't let that rabbit out of the hat just yet. I wish it were humanly possible for us to sit down with all of you and crank up those speakers on launch day.

The newest songs that we have written changed my perception of what a My Chemical Romance song can do. It pushes every envelope and blurs every single line more than anything we have ever done. I am also excited to finally announce that in the very near future, there will be an official home for the MCRMY on the web. We have all gotten a chance to field test the website, and not only is it major fun, but it's also kind of addictive.

In the next few weeks we are also going to start running a series of contests that will be a ton of fun for all of us. I know I have a one or two shirts with my name on them that could use a new home to give up for prizing.

Last but not least, In the newest issue of SPIN magazine, there's an amazing article/cover featuring our fearless leader (and my big
brother) Gerard Way. Iggy has been one of our heroes and inspirations throughout our career and the article is a joy to read.

There are gonna be a great many changes coming to mychemicalromance.com over the next few weeks/months. One day you will wake up, and nothing will ever be the same again, but it'll feel like an old friend. We love you guys more than you'll ever know. Let's talk again soon.

Mikey

Frank's picture

An update from the studio

Hello Friends,

Are you finally ready for some good news? Let me hear you say, "Eh, OK but make it quick".

Well my darlings, as I sit down to write to you, we are in the studio working on a brand new song. Ray's laying down some guitar tracks and I must admit, it's kicking my brain in the pants. I can't wait for you guys to hear this stuff, the songs we ended up writing this past month are so far advanced from where I thought this record would end up, it's not even funny.

Let's put it this way... say you had a time machine, and used said time machine to go back in time 1 year, found me, and played me some of the songs we just wrote. I would absolutely say, "you're a liar, and a full blown crazy person"... partly because the technology of a time machine doesn't really exist, but mostly because these new songs are light years ahead of our creative head space last year.

What a journey this has been, arduous at times, but always resulting in the band reaching new heights. Which is how it should be with a band that is never satisfied with just "good enough"...if it doesn't change the game, it isn't My Chemical Romance. You as fans shouldn't expect anything less. It feels as though everything we've ever done has been leading up to this moment. Like our entire lives have been a drill preparing us to stumble upon what Gerard has been referring to as "the new shit god-dammit."

So lets get down to it, with these new songs, or "the new shit god-dammit", plus the songs we've written over the past year, we basically have enough material for about 2.5 records now. However, we feel this past month has raised the creative bar so high that only the best of the best can live in harmony on the new record. But who knows...down the line, some of the songs we wrote over the past year that don't make this record could possibly surface again as b-sides or fun movie soundtrack stuff. I think it would be kinda rad at some point to have you all hear the songs that led us to our new found creative enlightenment. Either way, I just wanted to keep you all posted and let you know the record is coming along swimmingly, and we're working hard on making it the best we possibly can... can't wait to wrap it up and give it to you.

OK, good news part 2 of 3: I don't know if you knew this, but I like taking photos, and I've been taking quite a few pictures over the past months, trying my best to document the recording process. Some of which came out really good, and I'm pretty proud of. Recently, we've decided to take a few of these photos and share them with you in a really cool way. The past few days I've been staying up very late hand stamping, numbering and signing a set of 6 very limited art prints that will go up for sale on this site in the near future. The art prints will be released 2 per month for 3 months and are limited to 200 each. In the meantime, 2 new pics are up now and we will be posting new shots that aren't included within the print set in the photo section every week. So keep checking the site for the release of these prints and the posting of new photos from the My Chem inner sanctum.

Last, but certainly not least, I am proud to announce the addition of two new members to the MCR extended family. Recently, my wife and I found out we will be having twins later on this summer. I cannot express in words how happy this makes us, it seems everything's turning up Milhouse. I just can't wait to meet the little ones, and may God have mercy on the world now that there will be 2 more Ieros wreaking havoc on the earth.

Until next time friends, let us drink to peace, love, and never taking any shit off anybody.

xofrank

Jeff's picture

Gerard Way on the cover of SPIN's 25th Anniversary Issue

Check out SPIN's 25th Anniversary Cover with Gerard Way.

Frank's picture

One chapter ends and another begins...

Hello Friends,

Recently it seems as though every time we write to you guys we have bad news, and we apologize for that, but we've learned in life you can't have the sweet without the sour. As a band we have been very fortunate over the years that our sweet times have greatly outweighed the sour ones, and a great deal of that is owed to you, the fans. Which is why we wanted this news to come from us and not some bullshit gossip site.

As of 4 weeks ago, My Chemical Romance and Bob Bryar parted ways. This was a painful decision for all of us to make and was not taken lightly. We wish him the best of luck in his future endeavors and expect you all to do the same.

We also wanted to give you all a quick heads up on how the record is progressing. We have been writing some very powerful new songs so this week the four of us entered the studio once again, and what has been ending up on tape each night is some of the most exciting and honest work we have ever created.

Jeff's picture

Chile Quake

To everyone in Chile, our thoughts are with you. If you'd like to help Chile, you can donate to the Red Cross HERE.

Jeff's picture

Fan created playlist #1 - Amanda F.

Thanks to everyone for submitting their dream My Chemical Romance playlists. If you haven't created yours yet, post it as a comment HERE. This weeks fan playlist comes from Amanda F., and is in the MCR Myspace player now. Keep checking back every week to see if your playlist has been chosen.

Amanda's Playlist:
1. It's Not a Fashion Statement, It's a Deathwish
2. Heaven Help Us
3. Cubicles
4. To The End
5. Welcome to The Black Parade
6. My Way Home Is Through You
7. Teenagers
8. Demolition Lovers
9. Skylines and Turnstiles

Jeff's picture

Get The Black Parade Deluxe Edition at iTunes

The deluxe edition of The Black Parade is now available at iTunes - just click here to get it. The deluxe edition contains the original songs plus 3 b-sides AND a 40-minute video for the making of The Black Parade video.

Jeff's picture

Fan made MCR Myspace Playlists

Everybody has their own list of favorite MCR songs, now’s the time to share yours. Every week we’ll pick new playlists created by fans and change the My Chemical Romance Myspace player to feature the songs you’ve chosen. Want to submit your dream playlist? Here’s how:

1. Visit the My Chemical Romance Myspace page

2. Choose your 5 to 10 favorite My Chemical Romance songs that you want to see in the Myspace player

3. Post your list as a comment to this blog

4. Check back each week to see if your playlist was chosen and to listen to the new one

Each week when we post the new playlist, the name of the fan who created the playlist will be posted as well.

Frank's picture

A message from Frank

Hello Friends,

I got some good news and I got some bad news....while in the studio recently, Gerard started having some problems with his voice. At first we weren't too concerned about it and thought it would pass, as these things usually do, but the longer it went on the more worried we all got so he went to see the doctor. The good news is he's getting the best treatment possible and is going to make a full recovery, trust me we couldn't be more relieved. The bad news is it's not gonna go away overnight and we have to do what we hate doing most, cancel shows.

When we started this band all we ever wanted to do was write songs that meant something to us and play them live for as many people as we possibly could, and now in our old age all we want is exactly the same thing... and thats why canceling shows kills us so much, playing for people is what we live for. Your off-time applause, your beautiful dirty faces, your raw energy, and your wretched little voices singing our lyrics back to us fuel our fire, you make us feel alive, and we love every single one of you for that.

So know that as excited as you guys were to see us, we were even more excited to see you. But in order to make sure that we can continue to create music and play it live for all of you for a long time to come we need to give G the time he needs to heal.

We are incredibly sorry for bumming anyone out by canceling, and we hope you find it in your hearts to understand. We promise we will be back in Australia to make it up to you guys/gals as soon as possible. We miss you.

Until we meet again, xofrank

P.S. Please send all angry letters to:

Gerard Way's Throat
666 Coffee and Cigarettes Blvd
Los Angeles, CA 90069

Please visit http://www.soundwavefestival.com for further information.

Jeff's picture

Signed Posters Contest Winner

Congrats to the winner of The Black Parade signed posters, BeniDaBrute.

Thanks to everyone who entered the contest, make sure to keep an eye on MyChemicalRomance.com for more contests coming up very soon.

Remember the full body 24x36 inch promotional posters from The Black Parade? Right now, MyChemicalRomance.com is giving away a full set, one of each band member, to one lucky registered member. One more thing – all of the posters are signed by the band members.

Here’s how to enter the contest:

1. Register Here for MyChemicalRomance.com if you haven't already. (Use a real email address or we won’t be able to contact you if you win.)
2. Post a comment to this news post explaining in three sentences or less why you want to win the contest.

On February 4th, we’ll pick the winner at random and announce it on the site so make sure you check back.

Good luck.